content
stringlengths
4
1.04M
lang
stringclasses
358 values
score
int64
0
5
repo_name
stringlengths
5
114
repo_path
stringlengths
4
229
repo_licenses
listlengths
1
8
# take input from the user num = as.integer(readline(prompt="Enter a number: ")) factorial = 1 # check is the number is negative, positive or zero if(num < 0) { print("Sorry, factorial does not exist for negative numbers") } else if(num == 0) { print("The factorial of 0 is 1") } else { for(i in 1:num) { factorial = factorial * i } print(paste("The factorial of", num ,"is",factorial)) } x <- 0 if (x < 0) { print("Negative number") } else if (x > 0) { print("Positive number") } else print("Zero") x <- 1:5 for (val in x) { if (val == 3){ next } print(val) } x <- 1 repeat { print(x) x = x+1 if (x == 6){ break } } `%divisible%` <- function(x,y) { if (x%%y ==0) return (TRUE) else return (FALSE) } switch("length", "color" = "red", "shape" = "square", "length" = 5) [1] 5 recursive.factorial <- function(x) { if (x == 0) return (1) else return (x * recursive.factorial(x-1)) } pow <- function(x, y) { # function to print x raised to the power y result <- x^y print(paste(x,"raised to the power", y, "is", result)) } A <- read.table("x.data", sep=",", col.names=c("year", "my1", "my2")) nrow(A) # Count the rows in A summary(A$year) A$newcol <- A$my1 + A$my2 # Makes a new newvar <- A$my1 - A$my2 # Makes a A$my1 <- NULL # Removes str(A) summary(A) library(Hmisc) contents(A) describe(A) set.seed(102) # This yields a good illustration. x <- sample(1:3, 15, replace=TRUE) education <- factor(x, labels=c("None", "School", "College")) x <- sample(1:2, 15, replace=TRUE) gender <- factor(x, labels=c("Male", "Female")) age <- runif(15, min=20,max=60) D <- data.frame(age, gender, education) rm(x,age,gender,education) print(D) # Table about education table(D$education) # Table about education and gender -- table(D$gender, D$education) # Joint distribution of education and gender -- table(D$gender, D$education)/nrow(D) # Add in the marginal distributions also addmargins(table(D$gender, D$education)) addmargins(table(D$gender, D$education))/nrow(D) # Generate a good LaTeX table out of it -- library(xtable) xtable(addmargins(table(D$gender, D$education))/nrow(D), digits=c(0,2,2,2,2)) by(D$age, D$gender, mean) by(D$age, D$gender, sd) by(D$age, D$gender, summary) a <- matrix(by(D$age, list(D$gender, D$education), mean), nrow=2) rownames(a) <- levels(D$gender) colnames(a) <- levels(D$education) print(a) print(xtable(a)) dat <- read.csv(file = "files/dataset-2013-01.csv", header = TRUE) interim_object <- data.frame(rep(1:100, 10), rep(101:200, 10), rep(201:300, 10)) object.size(interim_object) rm("interim_object") ls() rm(list = ls()) vector1 <- c(5,9,3) vector2 <- c(10,11,12,13,14,15) array1 <- array(c(vector1,vector2),dim = c(3,3,2)) vector3 <- c(9,1,0) vector4 <- c(6,0,11,3,14,1,2,6,9) array2 <- array(c(vector1,vector2),dim = c(3,3,2)) matrix1 <- array1[,,2] matrix2 <- array2[,,2] result <- matrix1+matrix2 print(result) column.names <- c("COL1","COL2","COL3") row.names <- c("ROW1","ROW2","ROW3") matrix.names <- c("Matrix1","Matrix2") result <- array(c(vector1,vector2),dim = c(3,3,2),dimnames = list(row.names, column.names, matrix.names)) print(result[3,,2]) print(result[1,3,1]) print(result[,,2]) # Load the package required to read JSON files. library("rjson") result <- fromJSON(file = "input.json") print(result) x <- c(151, 174, 138, 186, 128, 136, 179, 163, 152, 131) y <- c(63, 81, 56, 91, 47, 57, 76, 72, 62, 48) relation <- lm(y~x) print(relation) relation <- lm(y~x) png(file = "linearregression.png") plot(y,x,col = "blue",main = "Height & Weight Regression", abline(lm(x~y)),cex = 1.3,pch = 16,xlab = "Weight in Kg",ylab = "Height in cm") dev.off() data <- c("East","West","East","North","North","East","West","West","West","East","North") print(data) print(is.factor(data)) factor_data <- factor(data) print(factor_data) print(is.factor(factor_data)) v <- c(7,12,28,3,41) # Give the chart file a name. png(file = "line_chart_label_colored.jpg") plot(v,type = "o", col = "red", xlab = "Month", ylab = "Rain fall", main = "Rain fall chart")
R
4
JesseVermeulen123/bat
tests/syntax-tests/source/R/test.r
[ "Apache-2.0", "MIT" ]
--# -path=.:../abstract:../common -- documentation of French in French: the default introduced in LangFre concrete DocumentationFre of Documentation = CatFre ** DocumentationFreFunctor with (Terminology = TerminologyFre) ;
Grammatical Framework
3
daherb/gf-rgl
src/french/DocumentationFre.gf
[ "BSD-3-Clause" ]
FROM functions/nodebase:alpine-6.9.1 ENV NODE_ENV=dev COPY handler.js .
Dockerfile
2
lihaiswu/faas
sample-functions/NodeHelloEnv/Dockerfile
[ "MIT" ]
# =============================================================================== # http://www.gnu.org/software/autoconf-archive/ax_cflags_strict_prototypes.html # =============================================================================== # # SYNOPSIS # # AX_CFLAGS_STRICT_PROTOTYPES [(shellvar [,default, [A/NA]] # # DESCRIPTION # # Try to find a compiler option that requires strict prototypes. # # The sanity check is done by looking at sys/signal.h which has a set of # macro-definitions SIG_DFL and SIG_IGN that are cast to the local # signal-handler type. If that signal-handler type is not fully qualified # then the system headers are not seen as strictly prototype clean. # # For the GNU CC compiler it will be -fstrict-prototypes # -Wstrict-prototypes The result is added to the shellvar being CFLAGS by # default. # # DEFAULTS: # # - $1 shell-variable-to-add-to : CFLAGS # - $2 add-value-if-not-found : nothing # - $3 action-if-found : add value to shellvariable # - $4 action-if-not-found : nothing # # NOTE: These macros depend on AX_APPEND_FLAG. # # LICENSE # # Copyright (c) 2008 Guido U. Draheim <[email protected]> # # This program is free software; you can redistribute it and/or modify it # under the terms of the GNU General Public License as published by the # Free Software Foundation; either version 3 of the License, or (at your # option) any later version. # # This program is distributed in the hope that it will be useful, but # WITHOUT ANY WARRANTY; without even the implied warranty of # MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General # Public License for more details. # # You should have received a copy of the GNU General Public License along # with this program. If not, see <http://www.gnu.org/licenses/>. # # As a special exception, the respective Autoconf Macro's copyright owner # gives unlimited permission to copy, distribute and modify the configure # scripts that are the output of Autoconf when processing the Macro. You # need not follow the terms of the GNU General Public License when using # or distributing such scripts, even though portions of the text of the # Macro appear in them. The GNU General Public License (GPL) does govern # all other use of the material that constitutes the Autoconf Macro. # # This special exception to the GPL applies to versions of the Autoconf # Macro released by the Autoconf Archive. When you make and distribute a # modified version of the Autoconf Macro, you may extend this special # exception to the GPL to apply to your modified version as well. #serial 12 AC_DEFUN([AX_FLAGS_STRICT_PROTOTYPES],[dnl AS_VAR_PUSHDEF([FLAGS],[_AC_LANG_PREFIX[]FLAGS])dnl AS_VAR_PUSHDEF([VAR],[ac_cv_[]_AC_LANG_ABBREV[]flags_strict_prototypes])dnl AC_CACHE_CHECK([m4_ifval($1,$1,FLAGS) for strict prototypes], VAR,[VAR="no, unknown" ac_save_[]FLAGS="$[]FLAGS" for ac_arg dnl in "-pedantic -Werror % -fstrict-prototypes -Wstrict-prototypes" dnl GCC "-pedantic -Werror % -Wstrict-prototypes" dnl try to warn atleast "-pedantic -Werror % -Wmissing-prototypes" dnl try to warn atleast "-pedantic -Werror % -Werror-implicit-function-declaration" dnl "-pedantic -Werror % -Wimplicit-function-declaration" dnl "-pedantic % -Wstrict-prototypes %% no, unsupported" dnl oops # do FLAGS="$ac_save_[]FLAGS "`echo $ac_arg | sed -e 's,%%.*,,' -e 's,%,,'` AC_TRY_COMPILE([],[return 0;], [VAR=`echo $ac_arg | sed -e 's,.*% *,,'` ; break]) done case ".$VAR" in .|.no|.no,*) ;; *) # sanity check with signal() from sys/signal.h cp config.log config.tmp AC_TRY_COMPILE([#include <signal.h>],[ if (signal (SIGINT, SIG_IGN) == SIG_DFL) return 1; if (signal (SIGINT, SIG_IGN) != SIG_DFL) return 2;], dnl the original did use test -n `$CC testprogram.c` [if test `diff config.log config.tmp | grep -i warning | wc -l` != 0 then if test `diff config.log config.tmp | grep -i warning | wc -l` != 1 then VAR="no, suppressed, signal.h," ; fi ; fi], [VAR="no, suppressed, signal.h"]) rm config.tmp ;; esac FLAGS="$ac_save_[]FLAGS" ]) AS_VAR_POPDEF([FLAGS])dnl AC_REQUIRE([AX_APPEND_FLAG]) case ".$VAR" in .ok|.ok,*) m4_ifvaln($3,$3) ;; .|.no|.no,*) m4_default($4,[m4_ifval($2,[AX_APPEND_FLAG([$2], [$1])])]) ;; *) m4_default($3,[AX_APPEND_FLAG([$VAR], [$1])]) ;; esac AS_VAR_POPDEF([VAR])dnl ])dnl AX_FLAGS_STRICT_PROTOTYPES AC_DEFUN([AX_CFLAGS_STRICT_PROTOTYPES],[dnl AC_LANG_PUSH([C]) AX_FLAGS_STRICT_PROTOTYPES([$1], [$2], [$3], [$4]) AC_LANG_POP([C]) ]) AC_DEFUN([AX_CXXFLAGS_STRICT_PROTOTYPES],[dnl AC_LANG_PUSH([C++]) AX_FLAGS_STRICT_PROTOTYPES([$1], [$2], [$3], [$4]) AC_LANG_POP([C++]) ])
M4
4
joshrose/audacity
lib-src/libscorealign/autotools/m4/ax_cflags_strict_prototypes.m4
[ "CC-BY-3.0" ]
// \pp 03\25\11 // tests the fidelity of translating THREADS shared[4] int X[THREADS*4]; shared int Y[THREADS]; // shared int Z[2 * THREADS+1]; /* not yet supported */ int main() { int x = 2 * THREADS; int y = THREADS; int z = 2 * THREADS + 1; }
Unified Parallel C
3
maurizioabba/rose
tests/CompileTests/UPC_tests/threads_in_expression.upc
[ "BSD-3-Clause" ]
use std::ops::FnMut; pub fn main() { let mut f = |x: isize, y: isize| -> isize { x + y }; let z = f(1_usize, 2); //~ ERROR mismatched types println!("{}", z); }
Rust
3
Eric-Arellano/rust
src/test/ui/unboxed-closures/unboxed-closures-type-mismatch.rs
[ "ECL-2.0", "Apache-2.0", "MIT-0", "MIT" ]
# Check that we properly handle a change to the number of outputs on a composite # rule. # Perform the initial build # # RUN: rm -rf %t.build # RUN: mkdir -p %t.build # RUN: ln -s %s %t.build/build.ninja # RUN: echo "build input-1 input-2: ECHO" > %t.build/output-specs.ninja # RUN: echo "build output: CAT input-1 input-2" >> %t.build/output-specs.ninja # RUN: %{llbuild} ninja build --jobs 1 --chdir %t.build &> %t1.out # RUN: %{FileCheck} --check-prefix=CHECK-INITIAL --input-file=%t1.out %s # # CHECK-INITIAL: ECHO input-1 input-2 # CHECK-INITIAL: cat input-1 input-2 > output # Update the number of inputs and rebuild. # # RUN: echo "build input-1 input-2 input-3: ECHO" > %t.build/output-specs.ninja # RUN: echo "build output: CAT input-1 input-2 input-3" >> %t.build/output-specs.ninja # RUN: %{llbuild} ninja build --jobs 1 --chdir %t.build &> %t2.out # RUN: %{FileCheck} --check-prefix=CHECK-REBUILD --input-file=%t2.out %s # # CHECK-REBUILD-NOT: missing input # CHECK-REBUILD: ECHO input-1 input-2 input-3 # CHECK-REBUILD-NOT: missing input # CHECK-REBUILD: cat input-1 input-2 input-3 > output # Check the output. # # RUN: %{FileCheck} --check-prefix=CHECK-OUTPUT --input-file=%t.build/output %s # # CHECK-OUTPUT: input-1 # CHECK-OUTPUT-NEXT: input-2 # CHECK-OUTPUT-NEXT: input-3 rule ECHO command = for i in ${out}; do echo $${i} > $${i}; done description = ECHO ${out} rule CAT command = cat ${in} > ${out} include output-specs.ninja
Ninja
4
trombonehero/swift-llbuild
tests/Ninja/Build/changed-multiple-outputs-command.ninja
[ "Apache-2.0" ]
function omf.reload -d "Reload fish process via exec, keeping some context" set -q CI; and return 0 history --save set -gx dirprev $dirprev set -gx dirnext $dirnext set -gx dirstack $dirstack set -gx fish_greeting '' exec fish end
fish
4
codetriage-readme-bot/oh-my-fish
pkg/omf/functions/core/omf.reload.fish
[ "MIT" ]
(ns todomvc.components.todo-edit (:require [reagent.core :as reagent] [todomvc.actions :as actions] [todomvc.helpers :as helpers])) (defn on-key-down [k id title default editing] (let [key-pressed (.-which k)] (condp = key-pressed helpers/enter-key (actions/save-todo id title editing) helpers/escape-key (do (reset! title default) (reset! editing false)) nil))) (defn component-render [{:keys [id title completed]} editing] (let [default title edit-title (reagent/atom default)] (fn [] [:input.edit {:type "text" :style {:display (helpers/display-elem @editing)} :value @edit-title :on-change #(reset! edit-title (-> % .-target .-value)) :on-blur #(actions/save-todo id edit-title editing) :on-key-down #(on-key-down % id edit-title default editing)}]))) (defn component-did-update [x] (.focus (reagent/dom-node x))) (defn component [] (reagent/create-class {:reagent-render component-render :component-did-update component-did-update}))
Clojure
5
dtelaroli/todomvc
examples/reagent/src/cljs/todomvc/components/todo_edit.cljs
[ "MIT" ]
--TEST-- Bug #72971 (2): SimpleXML property write does not respect namespace --EXTENSIONS-- simplexml --FILE-- <?php $xml = new SimpleXMLElement('<root xmlns:ns="ns"><foo>bar</foo><ns:foo>ns:bar</ns:foo></root>'); $xml->foo = 'new-bar'; var_dump($xml->foo); var_dump($xml->children('ns')->foo); $xml->children('ns')->foo = 'ns:new-bar'; var_dump($xml->foo); var_dump($xml->children('ns')->foo); ?> --EXPECT-- object(SimpleXMLElement)#2 (1) { [0]=> string(7) "new-bar" } object(SimpleXMLElement)#3 (1) { [0]=> string(6) "ns:bar" } object(SimpleXMLElement)#3 (1) { [0]=> string(7) "new-bar" } object(SimpleXMLElement)#2 (1) { [0]=> string(10) "ns:new-bar" }
PHP
4
NathanFreeman/php-src
ext/simplexml/tests/bug72971_2.phpt
[ "PHP-3.01" ]
: HELLO ( -- ) ." Hello Forth (fth)!" ; HELLO
Forth
3
JavascriptID/sourcerer-app
src/test/resources/samples/langs/Forth/hello-forth.fth
[ "MIT" ]
- view: page_views derived_table: sql: | SELECT -- user a.user_id AS user_custom_id, a.domain_userid AS user_snowplow_domain_id, a.network_userid AS user_snowplow_crossdomain_id, -- sesssion a.domain_sessionid AS session_id, a.domain_sessionidx AS session_index, -- page view a.page_view_id, ROW_NUMBER() OVER (PARTITION BY a.domain_userid ORDER BY b.min_tstamp) AS page_view_index, ROW_NUMBER() OVER (PARTITION BY a.domain_sessionid ORDER BY b.min_tstamp) AS page_view_in_session_index, -- page view: time b.min_tstamp AS page_view_start, -- different from canonical SQL b.max_tstamp AS page_view_end, -- different from canonical SQL -- example derived dimensions -- TO_CHAR(CONVERT_TIMEZONE('UTC', 'Europe/London', b.min_tstamp), 'YYYY-MM-DD HH24:MI:SS') AS page_view_time, -- TO_CHAR(CONVERT_TIMEZONE('UTC', 'Europe/London', b.min_tstamp), 'YYYY-MM-DD HH24:MI') AS page_view_minute, -- TO_CHAR(CONVERT_TIMEZONE('UTC', 'Europe/London', b.min_tstamp), 'YYYY-MM-DD HH24') AS page_view_hour, -- TO_CHAR(CONVERT_TIMEZONE('UTC', 'Europe/London', b.min_tstamp), 'YYYY-MM-DD') AS page_view_date, -- TO_CHAR(DATE_TRUNC('week', CONVERT_TIMEZONE('UTC', 'Europe/London', b.min_tstamp)), 'YYYY-MM-DD') AS page_view_week, -- TO_CHAR(CONVERT_TIMEZONE('UTC', 'Europe/London', b.min_tstamp), 'YYYY-MM') AS page_view_month, -- TO_CHAR(DATE_TRUNC('quarter', CONVERT_TIMEZONE('UTC', 'Europe/London', b.min_tstamp)), 'YYYY-MM') AS page_view_quarter, -- DATE_PART(Y, CONVERT_TIMEZONE('UTC', 'Europe/London', b.min_tstamp))::INTEGER AS page_view_year, -- page view: time in the user's local timezone CONVERT_TIMEZONE('UTC', a.os_timezone, b.min_tstamp) AS page_view_start_local, CONVERT_TIMEZONE('UTC', a.os_timezone, b.max_tstamp) AS page_view_end_local, -- example derived dimensions -- TO_CHAR(CONVERT_TIMEZONE('UTC', a.os_timezone, b.min_tstamp), 'YYYY-MM-DD HH24:MI:SS') AS page_view_local_time, -- TO_CHAR(CONVERT_TIMEZONE('UTC', a.os_timezone, b.min_tstamp), 'HH24:MI') AS page_view_local_time_of_day, -- DATE_PART(hour, CONVERT_TIMEZONE('UTC', a.os_timezone, b.min_tstamp))::INTEGER AS page_view_local_hour_of_day, -- TRIM(TO_CHAR(CONVERT_TIMEZONE('UTC', a.os_timezone, b.min_tstamp), 'd')) AS page_view_local_day_of_week, -- MOD(EXTRACT(DOW FROM CONVERT_TIMEZONE('UTC', a.os_timezone, b.min_tstamp))::INTEGER - 1 + 7, 7) AS page_view_local_day_of_week_index, -- engagement b.time_engaged_in_s, -- CASE -- WHEN b.time_engaged_in_s BETWEEN 0 AND 9 THEN '0s to 9s' -- WHEN b.time_engaged_in_s BETWEEN 10 AND 29 THEN '10s to 29s' -- WHEN b.time_engaged_in_s BETWEEN 30 AND 59 THEN '30s to 59s' -- WHEN b.time_engaged_in_s > 59 THEN '60s or more' -- ELSE NULL -- END AS time_engaged_in_s_tier, c.hmax AS horizontal_pixels_scrolled, c.vmax AS vertical_pixels_scrolled, c.relative_hmax AS horizontal_percentage_scrolled, c.relative_vmax AS vertical_percentage_scrolled, -- CASE -- WHEN c.relative_vmax BETWEEN 0 AND 24 THEN '0% to 24%' -- WHEN c.relative_vmax BETWEEN 25 AND 49 THEN '25% to 49%' -- WHEN c.relative_vmax BETWEEN 50 AND 74 THEN '50% to 74%' -- WHEN c.relative_vmax BETWEEN 75 AND 100 THEN '75% to 100%' -- ELSE NULL -- END AS vertical_percentage_scrolled_tier, -- CASE WHEN b.time_engaged_in_s = 0 THEN TRUE ELSE FALSE END AS user_bounced, -- CASE WHEN b.time_engaged_in_s >= 30 AND c.relative_vmax >= 25 THEN TRUE ELSE FALSE END AS user_engaged, -- page a.page_urlhost || a.page_urlpath AS page_url, a.page_urlscheme AS page_url_scheme, a.page_urlhost AS page_url_host, a.page_urlport AS page_url_port, a.page_urlpath AS page_url_path, a.page_urlquery AS page_url_query, a.page_urlfragment AS page_url_fragment, a.page_title, c.doc_width AS page_width, c.doc_height AS page_height, -- referer a.refr_urlhost || a.refr_urlpath AS referer_url, a.refr_urlscheme AS referer_url_scheme, a.refr_urlhost AS referer_url_host, a.refr_urlport AS referer_url_port, a.refr_urlpath AS referer_url_path, a.refr_urlquery AS referer_url_query, a.refr_urlfragment AS referer_url_fragment, CASE WHEN a.refr_medium IS NULL THEN 'direct' WHEN a.refr_medium = 'unknown' THEN 'other' ELSE a.refr_medium END AS referer_medium, a.refr_source AS referer_source, a.refr_term AS referer_term, -- marketing a.mkt_medium AS marketing_medium, a.mkt_source AS marketing_source, a.mkt_term AS marketing_term, a.mkt_content AS marketing_content, a.mkt_campaign AS marketing_campaign, a.mkt_clickid AS marketing_click_id, a.mkt_network AS marketing_network, -- location a.geo_country, a.geo_region, a.geo_region_name, a.geo_city, a.geo_zipcode, a.geo_latitude, a.geo_longitude, a.geo_timezone, -- often NULL (use os_timezone instead) -- IP a.user_ipaddress AS ip_address, a.ip_isp, a.ip_organization, a.ip_domain, a.ip_netspeed AS ip_net_speed, -- application a.app_id, -- browser d.useragent_version AS browser, d.useragent_family AS browser_name, d.useragent_major AS browser_major_version, d.useragent_minor AS browser_minor_version, d.useragent_patch AS browser_build_version, a.br_renderengine AS browser_engine, c.br_viewwidth AS browser_window_width, c.br_viewheight AS browser_window_height, a.br_lang AS browser_language, -- OS d.os_version AS os, d.os_family AS os_name, d.os_major AS os_major_version, d.os_minor AS os_minor_version, d.os_patch AS os_build_version, a.os_manufacturer, a.os_timezone, -- device d.device_family AS device, a.dvce_type AS device_type, a.dvce_ismobile AS device_is_mobile, -- page performance e.redirect_time_in_ms, e.unload_time_in_ms, e.app_cache_time_in_ms, e.dns_time_in_ms, e.tcp_time_in_ms, e.request_time_in_ms, e.response_time_in_ms, e.processing_time_in_ms, e.dom_loading_to_interactive_time_in_ms, e.dom_interactive_to_complete_time_in_ms, e.onload_time_in_ms, e.total_time_in_ms FROM ${scratch_pv_01.SQL_TABLE_NAME} AS a INNER JOIN ${scratch_pv_02.SQL_TABLE_NAME} AS b ON a.page_view_id = b.page_view_id INNER JOIN ${scratch_pv_03.SQL_TABLE_NAME} AS c ON a.page_view_id = c.page_view_id INNER JOIN ${scratch_pv_04.SQL_TABLE_NAME} AS d ON a.page_view_id = d.page_view_id INNER JOIN ${scratch_pv_05.SQL_TABLE_NAME} AS e ON a.page_view_id = e.page_view_id WHERE a.br_family != 'Robot/Spider' AND a.useragent NOT SIMILAR TO '%(bot|crawl|slurp|spider|archiv|spinn|sniff|seo|audit|survey|pingdom|worm|capture|(browser|screen)shots|analyz|index|thumb|check|facebook|PingdomBot|PhantomJS|YandexBot|Twitterbot|a_archiver|facebookexternalhit|Bingbot|BingPreview|Googlebot|Baiduspider|360(Spider|User-agent)|semalt)%' AND a.domain_userid IS NOT NULL -- rare edge case AND a.domain_sessionidx > 0 -- rare edge case -- AND a.app_id IN ('demo-app') -- AND a.page_urlhost IN ('website.com', 'another.website.com') -- AND a.name_tracker = 'namespace' sql_trigger_value: SELECT COUNT(*) FROM ${scratch_pv_05.SQL_TABLE_NAME} distkey: user_snowplow_domain_id sortkeys: page_view_start fields: # DIMENSIONS # User - dimension: user_custom_id type: string sql: ${TABLE}.user_custom_id group_label: 'User' - dimension: user_snowplow_domain_id type: string sql: ${TABLE}.user_snowplow_domain_id group_label: 'User' - dimension: user_snowplow_crossdomain_id type: string sql: ${TABLE}.user_snowplow_crossdomain_id group_label: 'User' hidden: true # Session - dimension: session_id type: string sql: ${TABLE}.session_id group_label: 'Session' - dimension: session_index type: number sql: ${TABLE}.session_index group_label: 'Session' # Page View - dimension: page_view_id type: string sql: ${TABLE}.page_view_id group_label: 'Page View' - dimension: page_view_index type: number sql: ${TABLE}.page_view_index # index across all sessions group_label: 'Page View' - dimension: page_view_in_session_index type: number sql: ${TABLE}.page_view_in_session_index # index within each session group_label: 'Page View' # Page View Time - dimension_group: page_view_start type: time timeframes: [time, minute, hour, date, week, month, quarter, year] sql: ${TABLE}.page_view_start group_label: 'Page View Time' - dimension_group: page_view_end type: time timeframes: [time, minute, hour, date, week, month, quarter, year] sql: ${TABLE}.page_view_end group_label: 'Page View Time' hidden: true # Page View Time (User Timezone) - dimension_group: page_view_start_local type: time timeframes: [time, time_of_day, hour_of_day, day_of_week] sql: ${TABLE}.page_view_start_local group_label: 'Page View Time (User Timezone)' convert_tz: false - dimension_group: page_view_end_local type: time timeframes: [time, time_of_day, hour_of_day, day_of_week] sql: ${TABLE}.page_view_end_local group_label: 'Page View Time (User Timezone)' convert_tz: false hidden: true # Engagement - dimension: time_engaged type: number sql: ${TABLE}.time_engaged_in_s group_label: 'Engagement' value_format: '0"s"' - dimension: time_engaged_tier type: tier tiers: [0, 10, 30, 60] style: integer sql: ${time_engaged} group_label: 'Engagement' value_format: '0"s"' - dimension: x_pixels_scrolled type: number sql: ${TABLE}.horizontal_pixels_scrolled group_label: 'Engagement' value_format: '0"px"' - dimension: y_pixels_scrolled type: number sql: ${TABLE}.vertical_pixels_scrolled group_label: 'Engagement' value_format: '0"px"' - dimension: x_percentage_scrolled type: number sql: ${TABLE}.horizontal_percentage_scrolled group_label: 'Engagement' value_format: '0\%' - dimension: y_percentage_scrolled type: number sql: ${TABLE}.vertical_percentage_scrolled group_label: 'Engagement' value_format: '0\%' - dimension: y_percentage_scrolled_tier type: tier tiers: [0, 25, 50, 75, 101] style: integer sql: ${y_percentage_scrolled} group_label: 'Engagement' value_format: '0\%' - dimension: user_bounced type: yesno sql: ${time_engaged} = 0 group_label: 'Engagement' - dimension: user_engaged type: yesno sql: ${time_engaged} >= 30 AND ${y_percentage_scrolled} >= 25 group_label: 'Engagement' # Page - dimension: page_url type: string sql: ${TABLE}.page_url group_label: 'Page' - dimension: page_url_scheme type: string sql: ${TABLE}.page_url_scheme group_label: 'Page' hidden: true - dimension: page_url_host type: string sql: ${TABLE}.page_url_host group_label: 'Page' - dimension: page_url_port type: number sql: ${TABLE}.page_url_port group_label: 'Page' hidden: true - dimension: page_url_path type: string sql: ${TABLE}.page_url_path group_label: 'Page' - dimension: page_url_query type: string sql: ${TABLE}.page_url_query group_label: 'Page' - dimension: page_url_fragment type: string sql: ${TABLE}.page_url_fragment group_label: 'Page' - dimension: page_title type: string sql: ${TABLE}.page_title group_label: 'Page' - dimension: page_width type: number sql: ${TABLE}.page_width group_label: 'Page' - dimension: page_height type: number sql: ${TABLE}.page_height group_label: 'Page' # Referer - dimension: referer_url type: string sql: ${TABLE}.referer_url group_label: 'Referer' - dimension: referer_url_scheme type: string sql: ${TABLE}.referer_url_scheme group_label: 'Referer' hidden: true - dimension: referer_url_host type: string sql: ${TABLE}.referer_url_host group_label: 'Referer' - dimension: referer_url_port type: number sql: ${TABLE}.referer_url_port group_label: 'Referer' hidden: true - dimension: referer_url_path type: string sql: ${TABLE}.referer_url_path group_label: 'Referer' - dimension: referer_url_query type: string sql: ${TABLE}.referer_url_query group_label: 'Referer' - dimension: referer_url_fragment type: string sql: ${TABLE}.referer_url_fragment group_label: 'Referer' - dimension: referer_medium type: string sql: ${TABLE}.referer_medium group_label: 'Referer' - dimension: referer_source type: string sql: ${TABLE}.referer_source group_label: 'Referer' - dimension: referer_term type: string sql: ${TABLE}.referer_term group_label: 'Referer' # Marketing - dimension: marketing_medium type: string sql: ${TABLE}.marketing_medium group_label: 'Marketing' - dimension: marketing_source type: string sql: ${TABLE}.marketing_source group_label: 'Marketing' - dimension: marketing_term type: string sql: ${TABLE}.marketing_term group_label: 'Marketing' - dimension: marketing_content type: string sql: ${TABLE}.marketing_content group_label: 'Marketing' - dimension: marketing_campaign type: string sql: ${TABLE}.marketing_campaign group_label: 'Marketing' - dimension: marketing_click_id type: string sql: ${TABLE}.marketing_click_id group_label: 'Marketing' - dimension: marketing_network type: string sql: ${TABLE}.marketing_network group_label: 'Marketing' # Location - dimension: geo_country type: string sql: ${TABLE}.geo_country group_label: 'Location' - dimension: geo_region type: string sql: ${TABLE}.geo_region group_label: 'Location' - dimension: geo_region_name type: string sql: ${TABLE}.geo_region_name group_label: 'Location' - dimension: geo_city type: string sql: ${TABLE}.geo_city group_label: 'Location' - dimension: geo_zipcode type: zipcode sql: ${TABLE}.geo_zipcode group_label: 'Location' - dimension: geo_latitude type: number sql: ${TABLE}.geo_latitude group_label: 'Location' hidden: true # use geo_location instead - dimension: geo_longitude type: number sql: ${TABLE}.geo_longitude group_label: 'Location' hidden: true # use geo_location instead - dimension: geo_timezone type: string sql: ${TABLE}.geo_timezone group_label: 'Location' hidden: true # use os_timezone instead - dimension: geo_location type: location sql_latitude: ${geo_latitude} sql_longitude: ${geo_longitude} group_label: 'Location' # IP - dimension: ip_address type: string sql: ${TABLE}.ip_address group_label: 'IP' - dimension: ip_isp type: string sql: ${TABLE}.ip_isp group_label: 'IP' - dimension: ip_organization type: string sql: ${TABLE}.ip_organization group_label: 'IP' - dimension: ip_domain type: string sql: ${TABLE}.ip_domain group_label: 'IP' - dimension: ip_net_speed type: string sql: ${TABLE}.ip_net_speed group_label: 'IP' # Application - dimension: app_id type: string sql: ${TABLE}.app_id group_label: 'Application' # Browser - dimension: browser type: string sql: ${TABLE}.browser group_label: 'Browser' - dimension: browser_name type: string sql: ${TABLE}.browser_name group_label: 'Browser' - dimension: browser_major_version type: string sql: ${TABLE}.browser_major_version group_label: 'Browser' - dimension: browser_minor_version type: string sql: ${TABLE}.browser_minor_version group_label: 'Browser' - dimension: browser_build_version type: string sql: ${TABLE}.browser_build_version group_label: 'Browser' - dimension: browser_engine type: string sql: ${TABLE}.browser_engine group_label: 'Browser' - dimension: browser_window_width type: number sql: ${TABLE}.browser_window_width group_label: 'Browser' - dimension: browser_window_height type: number sql: ${TABLE}.browser_window_height group_label: 'Browser' - dimension: browser_language type: string sql: ${TABLE}.browser_language group_label: 'Browser' # OS - dimension: os type: string sql: ${TABLE}.os group_label: 'OS' - dimension: os_name type: string sql: ${TABLE}.os_name group_label: 'OS' - dimension: os_major_version type: string sql: ${TABLE}.os_major_version group_label: 'OS' - dimension: os_minor_version type: string sql: ${TABLE}.os_minor_version group_label: 'OS' - dimension: os_build_version type: string sql: ${TABLE}.os_build_version group_label: 'OS' - dimension: os_manufacturer type: string sql: ${TABLE}.os_manufacturer group_label: 'OS' - dimension: os_timezone type: string sql: ${TABLE}.os_timezone group_label: 'OS' # Device - dimension: device type: string sql: ${TABLE}.device group_label: 'Device' - dimension: device_type type: string sql: ${TABLE}.device_type group_label: 'Device' - dimension: device_is_mobile type: yesno sql: ${TABLE}.device_is_mobile group_label: 'Device' # Page performance - dimension: redirect_time type: number sql: ${TABLE}.redirect_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: unload_time type: number sql: ${TABLE}.unload_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: app_cache_time type: number sql: ${TABLE}.app_cache_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: dns_time type: number sql: ${TABLE}.dns_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: tcp_time type: number sql: ${TABLE}.tcp_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: request_time type: number sql: ${TABLE}.request_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: response_time type: number sql: ${TABLE}.response_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: processing_time type: number sql: ${TABLE}.processing_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: dom_loading_to_interactive_time type: number sql: ${TABLE}.dom_loading_to_interactive_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: dom_interactive_to_complete_time type: number sql: ${TABLE}.dom_interactive_to_complete_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: onload_time type: number sql: ${TABLE}.onload_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' - dimension: total_time type: number sql: ${TABLE}.total_time_in_ms value_format: '0"ms"' group_label: 'Page Performance' # MEASURES - measure: row_count type: count group_label: 'Counts' - measure: page_view_count type: count_distinct sql: ${page_view_id} group_label: 'Counts' - measure: bounced_page_view_count type: count_distinct sql: ${page_view_id} filters: user_bounced: yes group_label: 'Counts' - measure: engaged_page_view_count type: count_distinct sql: ${page_view_id} filters: user_engaged: yes group_label: 'Counts' - measure: session_count type: count_distinct sql: ${session_id} group_label: 'Counts' - measure: user_count type: count_distinct sql: ${user_snowplow_domain_id} group_label: 'Counts' # Engagement - measure: total_time_engaged type: sum sql: ${time_engaged} value_format: '#,##0"s"' group_label: 'Engagement' - measure: average_time_engaged type: avg sql: ${time_engaged} value_format: '0.00"s"' group_label: 'Engagement' - measure: average_percentage_scrolled type: avg sql: ${y_percentage_scrolled} value_format: '0.00\%' group_label: 'Engagement' # Page performance - measure: average_request_time type: avg sql: ${request_time} value_format: '#,##0"ms"' group_label: 'Page Performance' - measure: average_response_time type: avg sql: ${response_time} value_format: '#,##0"ms"' group_label: 'Page Performance' - measure: average_time_to_dom_interactive type: avg sql: ${dom_loading_to_interactive_time} value_format: '#,##0"ms"' group_label: 'Page Performance' - measure: average_time_to_dom_complete type: avg sql: ${dom_interactive_to_complete_time} value_format: '#,##0"ms"' group_label: 'Page Performance' - measure: average_onload_time type: avg sql: ${onload_time} value_format: '#,##0"ms"' group_label: 'Page Performance' - measure: average_total_time type: avg sql: ${total_time} value_format: '#,##0"ms"' group_label: 'Page Performance'
LookML
5
chuwy/snowplow-build-test
5-data-modeling/web-model/looker/web-block-old-lookml/page_views.view.lookml
[ "Apache-2.0" ]
#define NORMAL_AS_3D #include "common.hlsl" struct VS_OUTPUT { float4 pos : POSITION; half4 color : TEXCOORD0; half2 texCoord : TEXCOORD1; float3 coord : TEXCOORD2; }; #ifdef VERTEX VS_OUTPUT main(VS_INPUT In) { VS_OUTPUT Out; Out.color = (half4)In.aColor; Out.texCoord = (half2)In.aTexCoord.xy; Out.coord = float3(In.aCoord.x, -In.aCoord.y, In.aCoord.z); Out.pos = mul(uViewProj, float4(In.aCoord.xyz * 5.0, 1.0)); Out.pos.z = Out.pos.w; return Out; } #else // PIXEL #ifdef SKY_AZURE #define SKY_CLOUDS #endif #ifdef SKY_CLOUDS #define STEPS 8.0 #define MIN_HEIGHT 2.0 #define MAX_HEIGHT 4.0 #define skyWind uParam.xyz #define skyDown float3(uLightProj[0].x, uLightProj[1].x, uLightProj[2].x) #define skyUp float3(uLightProj[0].y, uLightProj[1].y, uLightProj[2].y) #define sunDir float3(uLightProj[0].z, uLightProj[1].z, uLightProj[2].z) #define sunSize uLightProj[3].z #define sunColor float3(uLightProj[0].w, uLightProj[1].w, uLightProj[2].w) #define sunGlare uLightProj[3].w #define cloudsDown uPosScale[0].xyz #define cloudsUp uPosScale[1].xyz // based on https://www.shadertoy.com/view/XsVGz3 / https://www.shadertoy.com/view/XslGRr float noise3D(float3 p) { p = p * 0.15 + skyWind; return SAMPLE_3D(sNormal, p).x; } float density(float3 pos) { float den = noise3D(pos) * 3.0 - 2.0 + (pos.y - MIN_HEIGHT); float edge = 1.0 - smoothstep(MIN_HEIGHT, MAX_HEIGHT, pos.y); den = clamp(den * edge * edge, 0.0, 1.0); return den; } float3 raymarching(float2 screenPos, float3 dir, float t0, float t1, float3 backCol) { float dither = SAMPLE_2D_POINT_WRAP(sMask, screenPos * (1.0 / 8.0)).x; float3 step = dir * ((t1 - t0) / STEPS); float3 pos = dir * t0 + step * dither; float4 sum = 0.0; for (float i = 0.0; i < STEPS; i++) { float den = density(pos); if (den > 0.01) { float dif = max(0.0, den - density(pos + 0.3 * sunDir)) * 4.0; float4 col = float4(lerp(cloudsUp, cloudsDown, den), den); float3 lin = sunColor * dif + 1.0; col.rgb *= lin; col.a *= 0.5; col.rgb *= col.a; sum = sum + col * (1.0 - sum.a); } pos += step; } sum = clamp(sum, 0.0, 1.0); float h = dir.y; sum.rgb = lerp(sum.rgb, backCol, exp(-20.0 * h * h) ); return lerp(backCol, sum.xyz, sum.a); } #endif half4 main(VS_OUTPUT In) : COLOR0 { float3 dir = normalize(In.coord); #ifdef SKY_AZURE float3 col = lerp(skyDown, skyUp, dir.y); #else float3 col = SAMPLE_2D_LINEAR(sDiffuse, In.texCoord).xyz * In.color.xyz; #endif #ifdef SKY_CLOUDS float sun = clamp(sunSize + dot(sunDir, dir), 0.0, 1.0); col += sunColor * pow(sun, sunGlare); float2 dist = float2(MIN_HEIGHT, MAX_HEIGHT) / dir.y; if (dist.x > 0.0) { col = raymarching(In.pos.xy, dir, dist.x, dist.y, col); } #endif return half4(col, 1.0h); } #endif
HLSL
4
guitarpukpui/OpenLara
src/shaders/sky.hlsl
[ "BSD-2-Clause" ]
!macro customInstall SetRegView 64 WriteRegStr HKCR "*\shell\PicGo" "" "Upload pictures w&ith PicGo" WriteRegStr HKCR "*\shell\PicGo" "Icon" "$INSTDIR\PicGo.exe" WriteRegStr HKCR "*\shell\PicGo\command" "" '"$INSTDIR\PicGo.exe" "upload" "%1"' SetRegView 32 WriteRegStr HKCR "*\shell\PicGo" "" "Upload pictures w&ith PicGo" WriteRegStr HKCR "*\shell\PicGo" "Icon" "$INSTDIR\PicGo.exe" WriteRegStr HKCR "*\shell\PicGo\command" "" '"$INSTDIR\PicGo.exe" "upload" "%1"' !macroend !macro customUninstall DeleteRegKey HKCR "*\shell\PicGo" !macroend
NSIS
4
friend-ma/PicGo
build/installer.nsh
[ "MIT" ]
local info = { Version = { #{VER_MAJOR}, #{VER_MINOR}, #{VER_MICRO}, 0 }, MinFarVersion = #{MINFARVERSION}, Guid = win.Uuid("8e11ea75-0303-4374-ac60-d1e38f865449"), Title = "LuaFAR Search", Description = "Plugin for search and replace", Author = "Shmuel Zeigerman", } function export.GetGlobalInfo() return info; end
MAXScript
4
shmuz/far_plugins
plugins/luafarsearch/_globalinfo.lua.mcr
[ "MIT" ]
/* eslint-env jest */ import { parseRelativeUrl } from 'next/dist/shared/lib/router/utils/parse-relative-url' // convenience function so tests can be aligned neatly // and easy to eyeball const check = (windowUrl, targetUrl, expected) => { window.location = new URL(windowUrl) as any if (typeof expected === 'string') { expect(() => parseRelativeUrl(targetUrl)).toThrow(expected) } else { const parsedUrl = parseRelativeUrl(targetUrl) expect(parsedUrl.pathname).toBe(expected.pathname) expect(parsedUrl.search).toBe(expected.search) expect(parsedUrl.hash).toBe(expected.hash) } } describe('parseRelativeUrl', () => { beforeAll(() => { ;(global as any).window = { location: {}, } }) afterAll(() => { delete (global as any).window }) it('should parse relative url', () => { check( 'http://example.com:3210/someA/pathB?fooC=barD#hashE', '/someF/pathG?fooH=barI#hashJ', { pathname: '/someF/pathG', search: '?fooH=barI', hash: '#hashJ', } ) }) it('should parse relative url when start with dot', () => { check( 'http://example.com:3210/someA/pathB?fooC=barD#hashE', './someF/pathG?fooH=barI#hashJ', { pathname: '/someA/someF/pathG', search: '?fooH=barI', hash: '#hashJ', } ) check( 'http://example.com:3210/someA/pathB', '../someF/pathG?fooH=barI#hashJ', { pathname: '/someF/pathG', search: '?fooH=barI', hash: '#hashJ', } ) check( 'http://example.com:3210/someA/pathB', '../../someF/pathG?fooH=barI#hashJ', { pathname: '/someF/pathG', search: '?fooH=barI', hash: '#hashJ', } ) }) it('should parse relative url on special protocol', () => { check( 'ionic://localhost/someA/pathB?fooC=barD#hashE', '/someF/pathG?fooH=barI#hashJ', { pathname: '/someF/pathG', search: '?fooH=barI', hash: '#hashJ', } ) check( 'file:///someA/pathB?fooC=barD#hashE', '/someF/pathG?fooH=barI#hashJ', { pathname: '/someF/pathG', search: '?fooH=barI', hash: '#hashJ', } ) }) it('should parse the full url with current origin', () => { check( 'http://example.com:3210/someA/pathB?fooC=barD#hashE', 'http://example.com:3210/someF/pathG?fooH=barI#hashJ', { pathname: '/someF/pathG', search: '?fooH=barI', hash: '#hashJ', } ) }) it('should throw when parsing the full url with diff origin', () => { check( 'http://example.com:3210/someA/pathB?fooC=barD#hashE', 'http://google.com/someF/pathG?fooH=barI#hashJ', 'invariant: invalid relative URL' ) }) it('should throw when parsing the special prefix', () => { check( 'http://example.com:3210/someA/pathB?fooC=barD#hashE', 'mailto:[email protected]', 'invariant: invalid relative URL' ) check( 'http://example.com:3210/someA/pathB?fooC=barD#hashE', 'tel:+123456789', 'invariant: invalid relative URL' ) check( 'http://example.com:3210/someA/pathB?fooC=barD#hashE', 'sms:+123456789', 'invariant: invalid relative URL' ) }) })
TypeScript
5
nazarepiedady/next.js
test/unit/parse-relative-url.test.ts
[ "MIT" ]
.Wrapper { flex: 1; } .Option { max-width: 100%; padding: 0.25rem 0; } .OptionDisabled { opacity: .5; } .Label, .Input { font-size: 1em; } :global(.CodeMirror) { height: auto; font-size: 0.75rem; }
CSS
3
bjornstar/react-virtualized
source/demo/Wizard/Wizard.css
[ "MIT" ]
using StringTools; /***** INHERITANCE *****/ class Parent { public var seen = []; public function new() { seen.push("parent"); } } class Child extends Parent { override public function new(){ super(); // mandatory, and only works from new, for some reason :/ seen.push("child"); } } class HaxeExamples { /***** ATTRIBUTES *****/ // instance vs class attributes var instanceAttribute:String; static var classAttribute:String; // public vs private attributes public var publicAttribute:String; private var privateAttribute:String; public static var publicClassAttribute:String; // default value var varWithDefault = 'somestring'; // disambiguating local var from attribute var someValue = 1; function disambiguateLocalFromAttribute():Int { var someValue = 2; return this.someValue + someValue; // 3 } /***** METHODS *****/ // public vs private function public function publicMethod() { } private function privateMethod() { } // instance function vs class function function instanceMethod() { } static function classMethod() { } private static function privateClassMethod() {} // with typed arg function withTypedArg(arg:String) { } // with return type function withReturnType():String { return "zomg"; } // with no return type (aka side-effect city) function withNoReturnType():Void { } // with generic type function withGenericType<T>(something:T) { } // rebind methods with dynamic public dynamic function toRebind() { return "Original"; } // since brackets group expressions, a single expression does not need a group function noBrackets() return this; /***** MORE EXAMPLES!! *****/ public static function main() { var haxeExamples = new HaxeExamples(); // trace is a puts statement that tells you where it came from // it's documented at haxe.Log.trace trace("Hello World!"); // real stdout Sys.stdout().writeString("\033[32mnormal print statement \033[0m(with ansi escape codes embedded)\n"); // argv Sys.args(); // overridden methods trace(new Child().seen); // disambiguating trace(haxeExamples.disambiguateLocalFromAttribute()); // rebinding methods var originalAndRebound = haxeExamples.toRebind() + " -> "; haxeExamples.toRebind = function() { return "Rebound"; } originalAndRebound += haxeExamples.toRebind(); trace(originalAndRebound); // methods whose bodies have no brackets trace(haxeExamples.noBrackets()); // local var with explicitly typed arg var someNum:Int = 123; // reading a file var body = sys.io.File.getContent('to_be_read.txt'); // adding methods to a class // this comes from StringTools, but b/c first arg is a String (ie `this`) // and we declared we were `using` it, it will match type sigs until it finds the correct one trace(body.rtrim()); // parsing json var json = haxe.Json.parse('{"whereDidYouComeFrom":"I came from the jsons"}'); trace(json.whereDidYouComeFrom); /***** BOOLS / LOGIC *****/ trace(true == true); trace(true != true); if(true) trace("if with no else"); // if if(!true) trace("first conditional"); // if with else else if(true && false) trace("second conditional"); // conjunction else if(true || false) trace("third conditional"); // disjunction if(false && {trace("short-circuited"); true;}) null; // conditionals short-circuit /***** REFLECTION *****/ // http://api.haxe.org/haxe/PosInfos.html // http://haxe.org/manual/std-reflection.html // http://api.haxe.org//Reflect.html // http://api.haxe.org//Type.html // there's some metaprogramming in here, too, but Imma ignore it for now, b/c eff that amirite? // compiler macros var infos = function(?infos:haxe.PosInfos) { return infos; }(); // idk how else to get it to set the var other than to receive it as the last function arg trace(infos.fileName); // "HaxeExamples.hx" trace(infos.lineNumber); // 77, b/c that's where it got set trace(infos.methodName); // "main" trace(infos.className); // HaxeExamples // what type? trace(Type.typeof(haxeExamples.toRebind)); // classes trace(Type.resolveClass('Parent')); // Object.const_get :Parent trace(Type.resolveClass('NotAThing')); // Object.const_get :NotAThing if Object.constants.include?(:NotAThing) trace(Type.getSuperClass(Child)); // Child.superclass trace(Type.getSuperClass(Parent)); // BasicObject.superclass trace(Type.getClass(haxeExamples)); // haxe_examples.class trace(Type.getClassName(Child)); // Child.name // attributes trace(Reflect.fields({a:1, b:2})); // {a:1, b:2}.keys trace(Type.getInstanceFields(HaxeExamples)); // HaxeExamples.instance_methods trace(Reflect.hasField({a: 1}, "a")); // {a: 1}.key? :a trace(Reflect.hasField({a: 1}, "b")); // {a: 1}.key? :b trace(Reflect.field({a:1, b:2}, "a")); // {a:1}[:a] // enums // Type.resolveEnum('SomeEnum') // Type.getEnumName(SomeEnum) // Type.getEnumConstructs(SomeEnum) // Type.getEnum(someEnum) // Type.enumParameters(someEnum) // Type.enumIndex(someEnum) // Type.enumEq(someEnum, someOtherEnum) // Type.enumConstructor(someEnum, someOtherEnum) // Type.allEnums(someEnum) /***** TYPES *****/ // Basic types. And here's a list of operators http://haxe.org/manual/types-numeric-operators.html var b:Bool = true; var f:Float = 1.2; var i:Int = 3; var nonNullableInt = function(arg : Int = 0 ) return arg; var nullableInt = function(?arg : Int ) return arg; var nullableIntWithDefault = function(?arg : Int = -1) return arg; trace('nonNullableInt(123) ->', nonNullableInt(123)); trace('nonNullableInt() ->', nonNullableInt()); trace('nonNullableInt(null) ->', nonNullableInt(null)); trace('nullableInt(123) ->', nullableInt(123)); trace('nullableInt() ->', nullableInt()); trace('nullableInt(null) ->', nullableInt(null)); trace('nullableIntWithDefault(123) ->', nullableIntWithDefault(123)); trace('nullableIntWithDefault() ->', nullableIntWithDefault()); trace('nullableIntWithDefault(null) ->', nullableIntWithDefault(null)); } }
Haxe
5
JavascriptID/sourcerer-app
src/test/resources/samples/langs/Haxe/HaxeExamples.hx
[ "MIT" ]
static const uint32_t in_com1[2209] = { 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbde85867, 0x3e060969, 0x3dd11a7e, 0xbe26a669, 0xbe18f3a1, 0xbe933111, 0xbeebb5ca, 0x3e20f2dd, 0xbe547c76, 0xbeb0f580, 0xbe9e95cb, 0xbed62921, 0xbe6e19ee, 0xbda9575d, 0xbe7e58ce, 0xbe728c31, 0x3ee6b5c8, 0x3ee66649, 0x3e099e87, 0x3e008e8b, 0xbce5533c, 0x3cbdf6a4, 0xbcb896e4, 0x3dff7685, 0xbcb4ee27, 0x3dcd3f72, 0xbe94cbe3, 0x3dc968ff, 0xbee309ae, 0xbd197a4d, 0x3eeb9f21, 0xbe4b4f45, 0xbe6156ce, 0x3df013c9, 0x3d8d01b9, 0xbd1a3282, 0xbd8b3c3b, 0x3e358ab4, 0xbe85359a, 0xbdd1df27, 0xbe008231, 0xbe981764, 0x3df610de, 0x3e9f995f, 0x3e35b545, 0xbe17e1ef, 0xbe5e9075, 0xbe153249, 0xbe564335, 0x3e382e6d, 0xbecf2891, 0x3eaf94fa, 0xbce2e4f8, 0xbd5fdb23, 0xbdba6d0e, 0x3e2dc44b, 0x3edc71a7, 0x3d93bf02, 0xbe61e7b2, 0xbed2d7ea, 0xbe852e10, 0xbe219e77, 0xbc02c9ac, 0xbc14dbe8, 0xbe2acaac, 0xbde17f26, 0x3d563a22, 0x3df1d4b1, 0xbe32e890, 0xbc8cac4b, 0xbeb9adc9, 0xbd9fce94, 0x3e2201ae, 0xbe99abc8, 0x3f202647, 0xbe08b2e9, 0xbda90c64, 0xbd1427dc, 0x3da32195, 0xbe7f9ede, 0xbe8077db, 0x3e8a011f, 0xbe742e99, 0x3f0bc72e, 0x3eb6cea2, 0x3dfc4c97, 0xbe827626, 0x3db6d093, 0xbb4424e0, 0xbe37dae0, 0xbd8e6ad0, 0xbf04d3a0, 0x3f54ed49, 0xbd2ecb6a, 0xbdd0fdc3, 0xbdc5f93b, 0x3e5d6bc8, 0xbe832e4a, 0xbe77ec72, 0xbe9f985f, 0x3dc63a94, 0x3dfc2e71, 0xbe860fd6, 0x3d7ecce4, 0xbe724720, 0x3e30daab, 0xbd91aa51, 0x3e795fd6, 0x3ca4e14c, 0xbe9b5ffe, 0x3e6d6afd, 0x3d6e5c9c, 0x3daf7355, 0xbe2b0d21, 0x3f1cf9b2, 0x3cf30151, 0x3e721061, 0xbe57e752, 0xbe37787e, 0x3e9ac79d, 0x3cb57168, 0xbd80f175, 0xbd7ed290, 0xbdb541d1, 0xbe04e983, 0x3df6ac3c, 0x3f1d760d, 0xbeb11330, 0xbd3c0886, 0x3ee16c06, 0x3d48c2ce, 0x3d8fdf99, 0x3c6efd83, 0x3e9dbb08, 0xbe80bd0e, 0xbdd53a79, 0xbe83c3df, 0x3e3d255c, 0x3bb23e5b, 0xbe26a2b1, 0xbe938c85, 0x3ea03478, 0xbe2bb026, 0xbe782b2b, 0x3e41d2f4, 0xbd9d6add, 0x3e568911, 0xbe31475e, 0xbc9d7712, 0xbea675d1, 0x3dbd41e1, 0xbeaeac74, 0x3f2aab2d, 0xbde4fd11, 0x3b5b57d9, 0xbc32f886, 0x3e0db2df, 0x3eddfa32, 0xbcce6571, 0x3dbc4697, 0x3ed14912, 0x3f04cf3f, 0xbe8271bb, 0xbdd1f6ce, 0x3e97a5e6, 0xbe50dde9, 0x3dc0489b, 0xbd5fc83b, 0xbe8a1e87, 0x3e6273cf, 0x3f04115f, 0xbf0d15fb, 0xbd4994d1, 0x3f04e6e4, 0xbd0239bd, 0xbe45cbc0, 0x3e1487cb, 0xbd89a5c7, 0xbd3f4d80, 0xbeda58fe, 0x3ee47cee, 0xbd4a73fa, 0x3e7fa5a6, 0xbc40e4c8, 0xbda86a97, 0xbd85970b, 0x3e79d9a1, 0xbefafd5c, 0x3e17b02b, 0x3ef35761, 0x3c25c0ae, 0x3eab0c8c, 0xbf088e68, 0x3ed2e066, 0xbee14956, 0xbde2db3b, 0x3eb2e15f, 0x3f29f342, 0x3f01bc99, 0xbd06f8ba, 0xbedbf7a0, 0x3e104966, 0x3d6fc393, 0x3e998c9f, 0xbe1cdd61, 0xbc53a050, 0xbe0bb36e, 0x3da61113, 0xbd05a0de, 0xbdeca79b, 0xbd699c3e, 0xbe26cb9a, 0xbdec6e10, 0xbb69b748, 0xbed14cf5, 0xbe5e2090, 0xbd983b14, 0xbe152b72, 0xbd961b44, 0x3ea268df, 0xba843ef8, 0x3d3af70f, 0xbd534c66, 0xbdac9aad, 0xbe2bddf0, 0xbe1bbae6, 0xbe14b671, 0x3e8bd816, 0xbf5f3423, 0x3ef4dfd5, 0x3e92a103, 0x3cf52cd6, 0x3f0bd474, 0xbab9128e, 0x3d1954fa, 0x3af1ad97, 0xbdc2c30c, 0x3ed9ef8f, 0x3d4768ca, 0xbcc8e38b, 0xbbae3506, 0x3dd8d014, 0x3d5bcc5c, 0x3ecf0bf6, 0x3dbe38d9, 0x3e66afdc, 0xbeb09f3c, 0xbd46d3b4, 0x3f11c2a4, 0xbedf7e56, 0x3de68872, 0x3e88771f, 0xbef6251c, 0xbe620d57, 0xbd92daf7, 0xbd862e93, 0x3d6ac1be, 0x3ea7cb0b, 0xbde36359, 0xbe8df8c2, 0x3d6bcfdb, 0x3d23364e, 0x3e606fc9, 0xbe09be4e, 0xbec2ae0f, 0xbdff0052, 0x3a7eb5f3, 0xbe044937, 0x3de548e9, 0xbeb7b286, 0xbcc4ac70, 0xbcf20276, 0xbe1fd39c, 0x3eb3a246, 0xbdadb97c, 0x3ce00093, 0xbe931c5d, 0xbe46a7a8, 0x3d7ddff1, 0xbd511622, 0x3cbee9f7, 0x3efd53df, 0x3d09f1a6, 0xbec4487a, 0x3e44e230, 0x3e8acad5, 0x3c9a5e27, 0xbe0197b6, 0xbd3f357b, 0x3e1f0bba, 0x3e48ac58, 0xbd9133ce, 0xbd05fbd3, 0x3ed18c44, 0x3e226d96, 0x3e5fbe03, 0x3c8930bb, 0x3d7d85b7, 0xbe86bfaa, 0xbd86a652, 0x3dfb6082, 0x3c42864c, 0x3e0139db, 0xbe9fec0f, 0xbf0bf404, 0xbc730b2c, 0x3e95b1cc, 0xbe135bb3, 0x3e3c50f0, 0xbe8869c1, 0x3eba9a7f, 0xbf1843a9, 0xbed4fb7e, 0x3e65e44a, 0xbebafeae, 0xbd6c277a, 0xbe2f043b, 0x3e6fe712, 0x3e30e992, 0xbf05705d, 0xbe2a2fae, 0xbe887c07, 0x3ebb548d, 0xbe410b46, 0xbeb2241a, 0xbe77ce09, 0x3ef3241c, 0x3e9d5826, 0xbea2a40c, 0x3e86386a, 0xbe6197cb, 0x3c410116, 0xbf13d0ea, 0xbeb8a210, 0x3e85af4e, 0x3eb18135, 0xbebee715, 0xbe7461b4, 0x3e8878b9, 0x3e6bd29c, 0x3e3ec09d, 0xbed681e1, 0x3ef09a51, 0xbe86ddca, 0xbe8f66ec, 0x3e0cc550, 0xbe345b7c, 0x3ea839fa, 0xbe18e542, 0x3e28f5a7, 0xbd784bee, 0xbedc50f2, 0x3f2e0d64, 0xbdfea9da, 0x3d3ba3a6, 0x3da72dcf, 0x3db13eda, 0x3de1f03d, 0xbdaa7bd4, 0x3e8c70cd, 0x3e82b53c, 0xbdbe9208, 0x3e34b68c, 0x3e4b921a, 0xbe5f52f6, 0x3ee25e8e, 0x3d18c8ea, 0x3e599298, 0xbe99f9bf, 0x3d9165e8, 0xbe0db0e4, 0x3ddea399, 0xbef93b1f, 0xbd2a59e8, 0xbc5306f2, 0xbdba8904, 0xbe7c675f, 0xbe8d71e3, 0xbdc83542, 0x3e100b00, 0xbec41367, 0xbda71909, 0x3e930597, 0x3eb126fd, 0xbd4ce262, 0x3e0aaa73, 0xbeca6672, 0x3bd67727, 0x3cf34a7b, 0xbe844d89, 0xbdaec8c0, 0x3e17c57b, 0xbe647dc4, 0xbb957ec9, 0xbe2a511c, 0xbe86e6a3, 0x3eb7238f, 0xbdf6ec2a, 0xbe338720, 0xbe8b8aac, 0xbeb23a64, 0x3f06c497, 0x3d26f8b9, 0xbe232d8d, 0x3e88167a, 0xbe6f7636, 0x3d266212, 0xbd8e6fbe, 0x3e803e4e, 0xbee0f823, 0xbe2f9ca5, 0x3e37cfab, 0xbd6add51, 0x3daf7420, 0x3e813778, 0xbccbff19, 0x3b4e8f64, 0x3dd89fb7, 0xbf40107e, 0xbde92f49, 0x3e026c40, 0x3d82f3ba, 0xbc961770, 0xbec7f32d, 0xbe561812, 0x3dfc9a14, 0xbc85c0b3, 0xbd5b0e4a, 0xbd9746c2, 0xbe1d0e14, 0xbef940dd, 0xbcfa5073, 0x3e8f1575, 0xbec1ae43, 0x3dc30d11, 0xbe5063dc, 0xbdb307d2, 0x3d913bed, 0xbc1f041d, 0x3e2ab470, 0x3e0f5788, 0x3d5c4043, 0x3ddf9f6d, 0x3e45055a, 0x3ccf3964, 0xbeb45868, 0xbe6fa9d9, 0x3e839ac5, 0xbe87c218, 0xbf345d67, 0x3ed1ebce, 0x3e409a3d, 0x3e377370, 0x3e08b908, 0xbbcb8569, 0x3d54222d, 0xbecf0c23, 0xbe994866, 0x3e8978a6, 0x3e15a96c, 0xbedb132c, 0x3e0865cd, 0x3e799e05, 0x3e0984b3, 0xbefc21d9, 0xbe4779e5, 0xbeb15db3, 0x3e8de166, 0x3db13ed7, 0x3e4440f6, 0x3ebf54e4, 0xbd59aadc, 0xbe7145d8, 0x3cdf01d9, 0x3e7017be, 0xbe56bf59, 0xbe23e198, 0x3e354bb8, 0xbd725ae8, 0xbcc35682, 0xbeb5ce8c, 0x3d4990aa, 0x3e048005, 0x3cc9b765, 0x3dbda024, 0x3d35ae76, 0x3e54a7f0, 0xbe293caa, 0xbc15795d, 0x3e4cdc46, 0x3ef99557, 0xbe3890a3, 0x3dc26a6b, 0xbe55c363, 0x3eb4384c, 0xbddcf73a, 0x3ee62b87, 0x3d771c12, 0x3d88e873, 0x3ea201dd, 0x3ed549b9, 0xbe974434, 0x3e005313, 0xbd478eb1, 0x3e8514ea, 0x3f30cd9a, 0xbed777b6, 0xbed3f46d, 0xbcb2e19c, 0x3e9c3c08, 0xbe93488e, 0x3e9ecfb3, 0x3f07a4b6, 0x3e2740a1, 0xbdbde57d, 0xbca335a8, 0xbd89b13f, 0xbefe00be, 0xbdd9ade4, 0x3e7c0066, 0xbe766b1d, 0x3ed4c58a, 0x3d344e94, 0xbec4a347, 0x3e998f5e, 0x3ec503de, 0x3e0592b2, 0xbe4a8c71, 0xbe2b156a, 0xbf0dd912, 0xbd6b299c, 0xbe75c10b, 0xbe6b0a74, 0xbec80367, 0xbd5b7e54, 0x3e865d9f, 0xbcaebebd, 0x3d197461, 0xbe1a7e86, 0xbe0f0523, 0xbde87396, 0x3f2bf25b, 0xbe43cdc6, 0xbdac262b, 0x3d208ab2, 0xbe808e5e, 0xbe200c09, 0x3eceaf96, 0xbd6944f6, 0x3e587cd4, 0x3e9d3a83, 0xbec0bf1b, 0xbeab72f9, 0x3e8051b9, 0x3eaae152, 0xbd45e6dc, 0x3e5a1f57, 0xbc28fbcd, 0xbc30da76, 0xbef1b668, 0x3e6d402b, 0x3e3da158, 0xbc7478f0, 0x3e9efb06, 0xbdd27387, 0x3d203c90, 0x3ec02d93, 0xbebc4281, 0x3eba8cea, 0xbe167e85, 0x3cc9d600, 0xbee182c7, 0x3f1fd670, 0xbdf97663, 0xbdd009f8, 0xbecd9af1, 0x3f03bdf6, 0x3ec67dde, 0x3ef40026, 0xbee07779, 0x3c978881, 0xbc7cfc6c, 0xbeb1622c, 0x3ea885e0, 0x3e394728, 0x3d379b92, 0x3ed95a1f, 0xbebb000b, 0x3d7ed249, 0x3e9ac1b3, 0x3ec2aec5, 0x3d5ffd95, 0xbe9afe23, 0x3e858977, 0xbf164741, 0xbe872c94, 0x3d92a833, 0x3e826c93, 0xbdf648ba, 0x3e0d7d44, 0xbe11e8b9, 0x3e8c108a, 0x3ed61dc1, 0xbe021d9f, 0x3e563b13, 0x3d5a7278, 0xbe9270f2, 0xbe875c95, 0xbe16ded7, 0x3d499a78, 0x3eae5744, 0x3f09b810, 0x3e219619, 0x3e1b36c1, 0x3eec7980, 0xbe6b3188, 0x3dd571a4, 0xbd0015a9, 0xbe82b828, 0xbeac3daf, 0xbcbe2e74, 0xbe0bad6e, 0x3dd3d7db, 0x3cbc7651, 0x3e42fc18, 0x3b4c6011, 0x3f078af4, 0xbe636215, 0x3e0f931d, 0x3eeaf84f, 0x3e5a41e6, 0xbed64db3, 0x3de8911f, 0x3c43f80a, 0x3e1de7f1, 0xbeac357d, 0xbf020329, 0x3e5abaf5, 0x3e63cc0a, 0x3f0bdc04, 0x3e8a2c83, 0xbea2e227, 0x3d4bd094, 0x3ea1acca, 0x3e3ec9fd, 0xbd32c442, 0x3e19f9ea, 0xbe5e4040, 0x3e8bd89d, 0x3ef4d56a, 0x3dface8e, 0x3e9a8a27, 0xbd3d6f88, 0xbefcef4d, 0x3e61fc95, 0xbecd47b6, 0x3db4d967, 0xbe9682bb, 0xbe289c6c, 0xbe1cf1db, 0xbe30fc0b, 0x3ebc9f10, 0xbeeb3a68, 0xbe43781c, 0x3ece7aac, 0xbe91fc04, 0x3ec89204, 0xbea79a56, 0xbf14ed5e, 0x3f34e334, 0xbea4757a, 0x3cf7f9f6, 0x3de17e92, 0x3c13d152, 0xbd702426, 0xbd029991, 0xbf0248d2, 0x3d40cea8, 0x3c1c9462, 0xbb99f4a7, 0x3e87e6d5, 0xbe99ceb3, 0xbe006d9f, 0xbf209fa8, 0x3de8d54e, 0xbe0c74d3, 0x3d9c34b8, 0x3e04ddc1, 0xbddd42af, 0xbe279fad, 0xbeae2843, 0x3e80321b, 0x3ef248b1, 0x3d5afdb9, 0xbe7b93c4, 0x3ec4352c, 0xbee7ef78, 0x3e964357, 0x3c8a4b49, 0xbd27cbfc, 0xbdb20248, 0x3ef04ebb, 0xbcbb8902, 0x3d32fc3b, 0xbe1ea6ad, 0x3ecde9c8, 0xbe22cfb2, 0x3cd808ef, 0x3e6f8577, 0xbd97ea2a, 0x3e2fa435, 0x3d992aa7, 0x3f19981d, 0x3cef6be7, 0xbe65edff, 0xbe46afe5, 0x3eaefbba, 0xbdd0be92, 0x3df5248c, 0x3cfa0cc7, 0xbe21ece6, 0xbe2396e1, 0xbde4320d, 0x3ea184c9, 0x3d4d443c, 0x3e847ea3, 0x3e2f876e, 0x3ec315b7, 0x3ed7a594, 0xbdb833ce, 0xbe575bcc, 0xbe410060, 0x3e5eca17, 0xbea9d52a, 0x3e639d01, 0x3e8219ea, 0xbea95e82, 0x3e1d3564, 0xbe660298, 0x3e9f2709, 0xbebd1ef6, 0xbcd038f2, 0xbebc600f, 0xbe732aeb, 0xbe2a6b1e, 0x3b7b6b01, 0xbce07612, 0xbd66d137, 0xbce883bd, 0x3e0a2051, 0x3ce47439, 0x3f135c26, 0x3eb37853, 0xbdea3974, 0x3dba5ad6, 0xbeb83d9c, 0x3d9cbd95, 0xbdf32a41, 0x3edc59dd, 0xbe551f05, 0xbf1c2f3d, 0xbd52c448, 0xbdf7d942, 0xbd8ea835, 0x3e731454, 0xbe1a461d, 0xbd10301b, 0x3e9c806d, 0x3e161157, 0xbdbbc327, 0x3dc391ea, 0x3d626429, 0xbedac3b2, 0xbe8bd0e7, 0xbd5160f7, 0xbd2d7bc0, 0xbdfe2769, 0xbdad73a3, 0xbdb4a106, 0xbeb73e15, 0x3cd94a0d, 0x3d870370, 0xbd5d5a7b, 0x3e28175b, 0x3e96b4ac, 0x3e7bc279, 0x3dfc362e, 0xbdab95ff, 0x3e5b8519, 0xbe0346a4, 0xbd43a203, 0xbe252c4c, 0xbe61c512, 0xbe9ddb45, 0xbe4fe8ff, 0xbe6c95d4, 0xbe3eb9a1, 0x3e2ba50e, 0xbe054cff, 0xbda0692b, 0xbf04cdc0, 0xbeb25c53, 0xbe17d933, 0xbda9770e, 0x3e457906, 0x3e851dd5, 0x3f3ec00f, 0xbd772554, 0xbd997ef2, 0x3e844a16, 0x3d2a3a6f, 0x3d33522f, 0xbe37f7af, 0xbf207c80, 0x3d07bd0f, 0x3e3991d5, 0x3ef985a0, 0x3d0f977f, 0x3e38a821, 0x3e0b74f3, 0xbd3a841c, 0xbe64ee31, 0x3d3fbb52, 0xbec208f9, 0x3e4a6bf1, 0xbe681458, 0xbeaf2853, 0xbeb40b78, 0x3ec418f9, 0xbe8058e3, 0x3f7f69c3, 0xbdb79956, 0x3e4201e2, 0x3dd14f5a, 0xbc0ec9fd, 0x3e83e036, 0xbf034192, 0xbd9f0b91, 0x3e2bf28e, 0x3c9c3775, 0xbf04999f, 0xbf1e303f, 0xbe1aa848, 0xbecaa900, 0xbe6a5676, 0xbe898637, 0xbe2a86e3, 0x3e7654b9, 0x3d35e9d4, 0x3ea26055, 0x3ef9b0c8, 0x3eb0ea16, 0xbc31578b, 0xbde8faf1, 0xbb328417, 0x3e414d3c, 0xbcdb76ae, 0xbe66341d, 0x3e29f780, 0xbe7a3737, 0xbd30f6fd, 0xbf15725c, 0x3df8fc5b, 0xbdafdde5, 0xbe13e9f8, 0x3eb32844, 0xbdb9a948, 0xbebb0f0a, 0xbdf233fb, 0x3c832802, 0xbe78c1b5, 0x3e614fd2, 0xbcabf604, 0xbee129c7, 0xbe324ad8, 0xbd96fc0a, 0xbecbc0f6, 0xbdf36572, 0xbde30678, 0xbd0aac5c, 0xbdff4295, 0x3d299ff6, 0xbeed5793, 0xbf10ade8, 0xbe5acb15, 0xbe74a963, 0x3ec033cf, 0x3e4eaf54, 0xbd0ce821, 0x3e074599, 0x3d1a5562, 0x3ec1f9c8, 0x3dddb54f, 0xbebc1224, 0xbe608bb1, 0xbd5d3ca5, 0x3e99b855, 0x3de2ad04, 0x3e16cdf5, 0x3e822188, 0xbe3aa965, 0x3db8d4ae, 0xbdb0e502, 0xbf18e6f5, 0xbe3574f0, 0xbeab8a06, 0x3e3b1156, 0x3e8349c9, 0x3ec75828, 0x3d93599e, 0xbd32fecd, 0xbe5509f6, 0x3d0cc2b0, 0xbcff1b35, 0x3e4bf0da, 0x3e0c465d, 0xbe063c18, 0xbed0f4d0, 0x3e941479, 0xbd7d60fb, 0x3e7a7450, 0xbbbaf1b6, 0xbe891932, 0xbf03b7d1, 0xbea95b56, 0x3d697bd1, 0xbe157647, 0x3e01fa65, 0xbde7815d, 0xbd3278b4, 0xbf1bd2e4, 0xbce29790, 0xbf1579d5, 0xbe98734d, 0x3c5315c9, 0x3db8cd0f, 0xbd04cbc6, 0x3f1c8c27, 0x3e96e2ea, 0xbd519803, 0x3d5ef02f, 0xbeaa22ae, 0x3e87b419, 0xbd84d76c, 0x3da20039, 0xbe1a1838, 0x3e21da76, 0x3ccf1f96, 0x3e7e78f4, 0xbe17f187, 0xbe4720a1, 0xbed17d6a, 0xbd8d66b9, 0x3eb64439, 0xbdddce6a, 0x3d7f734c, 0x3e302d34, 0x3eb46eb1, 0x3d12f2c5, 0x3e875bf0, 0x3e032a98, 0x3de42b3a, 0x3e656e01, 0xbde60be4, 0x3e4bd2fb, 0xbe918a41, 0xbde703c6, 0xbd3ad899, 0xbe9fb87f, 0xbd3632cc, 0x3e4cb2e7, 0x3dd2d6a8, 0xbf2edee9, 0xbe9be1f6, 0xbe242a0d, 0xbe8a8cee, 0x3ed08d2a, 0x3e8b446d, 0xbe1209db, 0xbedad38d, 0xbc4e4d37, 0x3dd5756c, 0xbebef150, 0xbeabd98c, 0xbeccd019, 0x3eb25099, 0xbe40ed1d, 0x3dc5f3e0, 0xbe3a3fc4, 0xbdfbf08a, 0xbe574edf, 0xbd47b84b, 0x3d6166c7, 0xbea7d2f3, 0xbe4ad66d, 0x3eb0c920, 0xbeafb676, 0xbeb45853, 0xbeef6e6e, 0x3d90cae7, 0x3f026c93, 0x3bc9d192, 0xbe15eada, 0xbe455261, 0xbd5940fa, 0x3e7742fd, 0x3d316655, 0x3e5f90ca, 0x3e7d2120, 0x3d3d0e79, 0x3e359af2, 0xbc316f80, 0xbe7a89ca, 0x3dbf28e2, 0x3b3e5e00, 0xbdf0f34c, 0xbf167d07, 0x3dbedf15, 0x3e2d25d2, 0x3f079e5d, 0x3e315ab3, 0x3e13f5aa, 0x3dd02948, 0x3d187edc, 0xbe7c177a, 0xbe92f3cb, 0xbe14c6fb, 0x3e7ab9de, 0xbd074fc9, 0x3d5f363d, 0xbec20a62, 0xbdecacc9, 0xbe2f4ca0, 0xbec69ec6, 0xbdac23f1, 0x3ebacf9f, 0x3cfb54a4, 0xbec242c3, 0xbec6925c, 0x3f001ccb, 0xbe07733a, 0x3ec6ac23, 0xbca7eeb6, 0xbdb9d483, 0x3ee61e03, 0x3df65c73, 0xbea499c1, 0xbe4ff10a, 0x3e9d5f10, 0x3de33307, 0xbe80138e, 0xbdcba539, 0x3e80f10c, 0x3d935088, 0x3cd82f2b, 0xbdc31df5, 0x3f0ece8e, 0xbb60652d, 0xbea52339, 0x3dd9e204, 0xbdfe0131, 0x3f190f9f, 0xbd91daf4, 0x3ef2a3b8, 0xbe1e4d29, 0x3ea2c3e7, 0x3f02a174, 0xbdf82658, 0x3ef67472, 0x3ee46894, 0xbe668dff, 0xbf068355, 0x3ecc4ef6, 0xbea554d2, 0x3ed76f40, 0x3e02716d, 0xbe4f1e43, 0x3c41e5a6, 0xbe88d2b6, 0x3da8f4f4, 0x3f16e7b0, 0xbf0500ab, 0xbece01cd, 0xbecc80cd, 0x3d061590, 0xbc788215, 0x3e5031c5, 0xbd71c740, 0x3e04c52b, 0x3eae491a, 0x3db51fd7, 0x3e13d10f, 0xbc95380a, 0x3ef74644, 0x3dd5923d, 0x3e43714a, 0xbe926231, 0x3cc8ee37, 0xbeb7cc49, 0xbe6c6ff8, 0x3f072d75, 0xbeb7210a, 0xbedbc400, 0x3dbf64eb, 0x3dd08f29, 0x3dae6205, 0xbe976377, 0x3efb3884, 0xbd734b72, 0xbf1c741b, 0xbdfd69ee, 0xbbb89520, 0x3ea73389, 0xbebbc809, 0x3e700a7f, 0xbec0afd0, 0xbe13c134, 0x3e796cec, 0xbe05bdb8, 0x3ec355a2, 0x3debd437, 0x3e213bc6, 0x3e76167c, 0x3e689bcf, 0xbdfb5f80, 0x3e514402, 0xbe87f376, 0xbec565ad, 0x3e925ece, 0x3ec613a8, 0xbd1d73c6, 0x3e0de44e, 0xbe3b86a6, 0xbe6923c6, 0x3f3fb45a, 0xbe84cd1c, 0xbdad8655, 0x3f1da2cc, 0xbce87b41, 0x3e031839, 0xbeb99f77, 0xbd525109, 0xbd75e052, 0xbeb24140, 0x3e0a5e93, 0xbe655876, 0xbe0e1520, 0xbd985c31, 0xbc715c48, 0xbc04798c, 0xbe7bedc7, 0x3e0579cf, 0xbebd28d6, 0xbe9efdbf, 0x3d9ed3e4, 0xbdf89496, 0xbdafb002, 0xbe83b14b, 0xbf5fc796, 0x3d897bf6, 0xbc2fa124, 0x3e5f787f, 0x3f03894d, 0x3d9365bb, 0xbeada951, 0x3cf9ae02, 0x3e053161, 0xbe3a3e38, 0x3e890cc8, 0xbe9d1062, 0x3eb71f2d, 0xbf1df749, 0x3e88b551, 0x3bac7d48, 0x3d33c5c2, 0x3e162108, 0x3ea2ad18, 0x3ecbd763, 0x3dcdb01d, 0x3e7d3898, 0xbe34ed59, 0xbdb8a8a2, 0xbdf54590, 0x3e294212, 0xbe0232df, 0xbdcff9bd, 0xbe42275e, 0x3e58bc18, 0xbe5e534e, 0xbe6de49d, 0x3ef43b81, 0xbe8ad45c, 0xbc93a682, 0x3c843b26, 0xbec53d58, 0x3e96b788, 0x3e9562b7, 0xbe374617, 0x3e3d36f7, 0x3e632523, 0x3ead1251, 0xbec50d2f, 0xbe886ba6, 0xbe82857b, 0x3e972340, 0x3d7044cd, 0x3ca0742a, 0xbda5f815, 0xbeae9ae8, 0x3e78c1b5, 0xbe4795ad, 0x3e199c98, 0xbe92e477, 0xbe077b79, 0xbdd1aca4, 0x3db1f76c, 0x3ecd86ad, 0x3e43c2f2, 0xbc25c705, 0x3f3ed4f2, 0x3d1824b0, 0xbdde02a3, 0x3da7684f, 0x3dbf6756, 0x3c5eeccf, 0xbc18d928, 0xbeb9babe, 0x3dfbb619, 0xbde23b52, 0xbd9023b2, 0x3e6e6d8d, 0xbea3db1d, 0xbe5392cd, 0x3ea028ad, 0x3da0c9fb, 0x3ebfb2da, 0x3eefcae1, 0xbda54bb9, 0x3dba0e55, 0x3ed05eb8, 0xbcd27202, 0xbeaa10fd, 0x3eb115ce, 0xbf02f520, 0xbe27ada0, 0x3d0c52df, 0xbcbac07b, 0xbd674e8e, 0xbcef30ec, 0x3e188588, 0x3da1df40, 0xbe6cff45, 0xbd9ade58, 0x3ea77fd4, 0xbda8a93a, 0xbe944635, 0x3d24b28a, 0xbe5025c3, 0xbe81e0af, 0xbe46d7db, 0x3c9af7c2, 0x3dbb5a31, 0xbeb38fc8, 0x3ca23873, 0x3e9b6823, 0x3ed950d2, 0xba5a7944, 0x3efa5a48, 0xbd81600d, 0x3e1e8fcd, 0x3c68033b, 0x3eda4328, 0xbe103105, 0xbd41b15e, 0x3dccc5ba, 0x3edddc1a, 0x3e655ed2, 0x3caf3b84, 0xbe8357f6, 0xbd2efb66, 0x3dc94938, 0x3ee05713, 0x3db27017, 0x3e98e86f, 0x3d8e5550, 0xbe05c7cf, 0x3e1b3fad, 0x3e14917e, 0xbd9256f0, 0x3ec34480, 0x3daf4751, 0xbd96f480, 0xbe89005e, 0x3e4c20fa, 0xbe66a158, 0xbe9196b2, 0x3e31ca55, 0xbd8e1370, 0xbea8d06a, 0xbe62dd2a, 0xbf04688e, 0x3dac16e5, 0x3e0e7eb8, 0xbef98888, 0x3d07e32c, 0xbe25e1d7, 0xbe2414b5, 0xbdaee8dc, 0xbdbc2c22, 0x3eb2a8a3, 0x3defeb75, 0xbd30e850, 0xbdee0530, 0xbcce383c, 0xbdeea503, 0x3e4a5c17, 0xbeb1cbed, 0xbe973ad2, 0x3ebb325c, 0xbea4a6b4, 0x3f377c3d, 0xbd91b4e1, 0xbd134a77, 0xbcbc7a2f, 0xbe5840c2, 0x3e2242ba, 0xbeb037af, 0xbdcf911b, 0x3e8d8b2c, 0x3ce16603, 0x3e1a8f51, 0x3db681c6, 0xbef1da23, 0xbde70b61, 0x3e1d522e, 0x3a1b9beb, 0x3dfe9f15, 0x3e1adb4a, 0xbe2c1c1c, 0x3e12088b, 0xbdd3dfe7, 0xbe0f57bf, 0x3e831cc1, 0xbd344be2, 0x3dd24d37, 0x3f093fd5, 0x3e8c8888, 0xbe5c88b3, 0x3f10bc65, 0xbe3a91ee, 0x3e3b7228, 0xbdc0470a, 0x3dbdb809, 0x3c4efe8f, 0xbce4bd5a, 0xbef6f6d7, 0xbe477fb6, 0x3e3c5e05, 0xbed00a8b, 0x3e08843b, 0xbe916e8a, 0xbe3e20df, 0xbd85ed90, 0xbc062af2, 0xbec33de3, 0x3e331b27, 0x3ec6d4b3, 0xbed35641, 0xbe1ad98f, 0x3df76eea, 0x3e6e892d, 0xbe44d00e, 0xbe4546c2, 0xbe040d4e, 0x3f3f1980, 0x3c1fc44c, 0x3d077796, 0xbe6da5c8, 0xbe8487f8, 0xbc232fc8, 0x3ef30770, 0x3c884142, 0x3f076c80, 0x3e034218, 0xbd816bf9, 0xbe53d8af, 0xbe13db41, 0x3b309891, 0xbe1c9243, 0xbeb38711, 0xbe230e14, 0x3e2b3ad0, 0x3e905493, 0xbdfd8832, 0x3c9b5c45, 0xbd819353, 0x3e6766d4, 0xbdc1ec46, 0xbd3d3ae6, 0x3ec02254, 0xbcf8e27e, 0xbde8387a, 0x3e94e080, 0x3cf9aa78, 0xbe38151e, 0xbf30314c, 0xbe0bfc78, 0x3b029c98, 0xbcbdc065, 0x3d062bd8, 0x3cedff9c, 0xbe7e40fd, 0xbec62436, 0x3d74c49d, 0x3e3a392e, 0x3e626e99, 0xbe824937, 0x3e9a029c, 0x3be79063, 0xbed02c7d, 0xbd4e137b, 0xbdd33c21, 0x3d73656b, 0xbe9026ad, 0x3d1d0b14, 0x3ee7f918, 0xbe841b2f, 0xbe250f23, 0xbc5c3da2, 0xbda70b79, 0xbe9330a6, 0xbc4a0351, 0xbe6f97e9, 0xbf35afba, 0xbe1dacda, 0x3df8df05, 0xbcec490b, 0xbe79a9c5, 0xbe85c0ce, 0xbd6684e4, 0xbe824192, 0xbd3e4434, 0x3e7c29d0, 0xbe46e82c, 0x3c43866c, 0x3e6b7fb8, 0xbd68b3e9, 0x3e22c424, 0xbe4aa9d0, 0xbc6e74a4, 0x3e3d575d, 0x3eb523c7, 0x3dc2a84c, 0x3d065bfc, 0xbf40fce0, 0x3ef673ee, 0xbdc1d251, 0xbc440dca, 0xbe8ab21d, 0x3e4d46e7, 0xbe90ad58, 0x3e6457f9, 0x3eeacffd, 0x3e472181, 0xbefd4623, 0xbec9f7d4, 0x3ec38799, 0x3e246c4f, 0xbe775201, 0xbe414869, 0x3e9cb30e, 0x3eb7a1a8, 0xbe56ddac, 0x3edf38f6, 0x3dd8df47, 0x3e2cfb03, 0x3cb2654b, 0x3ebd83fb, 0xbda00a82, 0x3e1b6a28, 0xbf0e854d, 0x3ed80b11, 0x3edcec96, 0x3e1ec5e2, 0xbd068597, 0xbc7882c6, 0x3d4043af, 0x3e8d91b8, 0x3e6f734e, 0x3dc685e7, 0xbe49b6ff, 0xbdd12aaa, 0xbbc43652, 0xbe04668a, 0x3e9fd835, 0x3e45389b, 0x3f04a8e7, 0xbd66d060, 0x3e9eda9c, 0x3dbee577, 0x3e136dfd, 0x3ec4ac4b, 0x3ee409d7, 0xbe99a23e, 0xbec2b1fe, 0x3e40f6b1, 0x3ea0b1c6, 0xbc88a7d7, 0xbe0e1a1f, 0x3eb03998, 0x3e874863, 0xbdf51a0f, 0xbe10fe6c, 0xbe3b1835, 0x3e22d671, 0xbdbe5bc8, 0x3e89edd6, 0x3dfeaf95, 0xbe06eaed, 0x3def6cec, 0x3e4b91ea, 0x3dddd3bf, 0xbe032b1f, 0xbbefa87e, 0x3d3c996a, 0xbeff37f9, 0x3da3b482, 0xbdbb6017, 0x3df950a4, 0xbdb2e704, 0xbeb9353e, 0xbe4b1402, 0xbdba7f98, 0xbef11bfe, 0xbe14d882, 0x3d7e2475, 0xbe49a88a, 0xbd984151, 0x3d8b1738, 0xb953d075, 0xbe148fe7, 0x3f0aa686, 0x3c78a724, 0xbd9ddfc2, 0xbd526cb8, 0xbd12abfd, 0x3e4fdadf, 0xbdfbb1d1, 0x3cb5d532, 0x3eb970dc, 0xbed746ca, 0x3d989b54, 0xbe334696, 0xbdf85c09, 0x3e8d4c5d, 0xbe562d8a, 0x3e95fbee, 0x3e1a45ba, 0x3e29722d, 0x3d01e43c, 0xbec85267, 0x3e9d7d71, 0xbe8fa74a, 0xbc83fcb5, 0xbcdfe380, 0x3e038bc7, 0x3e44f803, 0x3c6d8800, 0x3ee60b98, 0x3d72ba6f, 0x3ddff16a, 0xbc970c6c, 0x3e47f529, 0x3d822421, 0xbc65df10, 0x3d34a932, 0xbe9f8a87, 0xbed49ee5, 0xbed4b33b, 0xbd61174e, 0x3ded67cc, 0xbeb8d550, 0xbe98a54f, 0xbe6f182a, 0xbf0a0c0c, 0x3e82e731, 0x3dfc8c46, 0x3e1a8b65, 0x3df8241f, 0xbdbb64e9, 0x3c6bbc61, 0x3ec18041, 0xbd03577b, 0xbe2b297b, 0xbeb8f824, 0x3e3c7f32, 0x3e2a1cd3, 0xbe61428b, 0xbe2ca898, 0x3e4cbde6, 0xbdb1b259, 0xbe177f6f, 0x3f25a089, 0x3f800000, 0xbed11e63, 0x3d068ca5, 0x3ecf686f, 0x3f46bde6, 0xbd91c99d, 0x3e532a89, 0xbdabde4f, 0xbe930cbe, 0x3eb2689a, 0x3dbd5607, 0xbe56eebb, 0x3eac5702, 0x3beaf300, 0xbe3bbc3e, 0xbdb06ee9, 0xbe5520a6, 0x3c6d0af7, 0x3ed7dec3, 0x3f27c5f2, 0x3dc94ae7, 0xbe3781fb, 0xbd2e14a3, 0x3dbd90bf, 0xbe4d4dd0, 0x3d9ae2cd, 0xbe52f917, 0xbc55f95a, 0xbe2c3b03, 0x3ec1c37b, 0x3e73dab3, 0x3e301b00, 0xbca526bd, 0x3e31ddcd, 0xbdcfc600, 0x3d46b28e, 0xbef967d9, 0xbe5941e2, 0xbe28596c, 0xbec4822a, 0xbd14cdfd, 0xbf17c605, 0x3e865de1, 0x3d4ccaef, 0xbe2e0efe, 0x3d844bc8, 0x3e9f8b81, 0xbe97d211, 0xbd477bf7, 0xbe41ec85, 0x3d30f822, 0xbe8236bc, 0x3e061171, 0x3e0b6801, 0x3eaf4451, 0x3ea6cfb5, 0xbf066a68, 0xbe322e40, 0xbd17a8cd, 0x3ecf8d40, 0xbddcb9e4, 0xbeae3f71, 0x3f11dd41, 0x3c2eab72, 0xbf0f7aba, 0xbe8f53fc, 0x3e436ec7, 0x3e716cba, 0xbebc1a50, 0xbd1ce13e, 0x3e850ba4, 0x3def9b24, 0xbd1d5402, 0xbe158c58, 0x3edf1bb1, 0xbe7b331b, 0x3e52575e, 0x3e8153ea, 0xbd14e1f1, 0x3ddce119, 0x3e95225f, 0x3ebf473d, 0xbdc9f93c, 0xbea33e23, 0xbe8369b7, 0xbecafbd1, 0x3cf5d1c2, 0x3f526918, 0xbead0f6c, 0x3ec53201, 0x3da35b54, 0x3efe08a7, 0x3cc1d3dd, 0x3e32a12e, 0xbdeab8f3, 0xbda2f75c, 0xbe77ce43, 0x3e033ce4, 0x3dc83ca9, 0x3efad49e, 0xbbbc070e, 0xbf29d542, 0xbe068778, 0x3d180f09, 0xbe589516, 0x3cc96fcd, 0xbe6d962a, 0xbe129783, 0x3bd2b5e2, 0xbda23266, 0xbeb36974, 0xbe920e91, 0x3e60cc31, 0xbda3620a, 0xbdd0775d, 0xbe3477a3, 0x3cdd9cc8, 0xbe7ecab4, 0xbcb300ca, 0x3dbd2c31, 0xbe8dbbda, 0xbe075426, 0xbeed8bb0, 0xbed477e1, 0x3de4de95, 0x3f0e5c35, 0xbc21e5ac, 0x3e1d5ae9, 0x3dfb4150, 0x3e9b78e4, 0x3d88e7df, 0xbc402d97, 0xbe072c0e, 0xbe3ed898, 0xbebd6d63, 0xbea238d8, 0x3e02548f, 0xbdf5e700, 0x3e41b86d, 0x3e2dbc40, 0xbf0af5df, 0x3eb0ab93, 0x3e4a8509, 0xbd6a25c0, 0xbdce1998, 0x3e4ed1be, 0xbe8a0412, 0x3dac439f, 0x3ebf61e4, 0x3e17ccab, 0x3d85afad, 0xbe230730, 0xbd3bd4ff, 0x3f6afedc, 0x3dce0065, 0x3e01eda7, 0xbe2a7b4e, 0xbe3d5c5d, 0x3e22ea9b, 0x3e2e7219, 0xbe42ad7b, 0x3d177ed3, 0x3bddfbc6, 0xbea524d4, 0x3d4e4d72, 0x3d31485d, 0x3e098c79, 0x3ceaed8d, 0x3e440e11, 0x3e1a2de3, 0xbd97f402, 0xbdc32298, 0x3dee0d9d, 0xbf08c529, 0x3d862e16, 0xbe54bdcb, 0xbddefff1, 0x3c36d4ce, 0x3e31dc25, 0xbe2ac8c6, 0x3db5f7f8, 0x3f29f8e5, 0x3ec89b27, 0x3e88c3d4, 0x3eb521f8, 0x3ddc0100, 0xbe3b5551, 0x3eede13f, 0x3e1ee91b, 0x3dc5734c, 0x3ecf0acd, 0xbdad8681, 0x3e1c2d16, 0xbd996f09, 0xbe884cac, 0xbea4bb9b, 0xbdb2a033, 0x3e95af9d, 0x3dc86402, 0xbe263497, 0xbe7593f1, 0xbf1d89b2, 0xbdcc1b31, 0xbd1f130a, 0x3ec1c4c5, 0xbe1b4bd6, 0x3f0d4ba1, 0xbe9aa5db, 0x3db72473, 0x3c2af003, 0xbed1d73b, 0x3e8d342a, 0xbed20032, 0xbeb98e71, 0xbd85813f, 0xbeef2df7, 0x3e82fa31, 0xbeaa8d21, 0x3d995b26, 0x3ef5498d, 0xbe43d780, 0xbe3deaaa, 0x3d5800fc, 0xbdc2b4b5, 0xbe686fb1, 0xbe5f8087, 0xbec38658, 0xbc23ade9, 0x3d7a240a, 0xbd699e23, 0x3d0568f0, 0x3df233c6, 0xbd4917ed, 0x3eb0ca90, 0xbec714b1, 0x3d4cd8c5, 0xbd110b1e, 0xbdafea11, 0xbd31165c, 0xbdd123fd, 0xbc76b663, 0x3e0eb208, 0x3da70e7c, 0xbec6c260, 0x3e87c315, 0x3e12f8ad, 0x3d6cfb8b, 0xbe052ef3, 0x3f1da487, 0xbecf151f, 0xbd871b38, 0x3dfcac04, 0xbe536cfa, 0x3d19b000, 0x3e6b3cea, 0xbe183117, 0x3efde7f6, 0xbea4fb46, 0xbda14c33, 0xbd081284, 0xbd141520, 0xbe340d13, 0xbe6fb708, 0x3e5f4bba, 0xbe000bdd, 0xbf14f2ac, 0xbe0de7de, 0xbca250e0, 0xb894cb24, 0xbe2ecaaa, 0xbe727f26, 0xbd07d723, 0x3d6590bc, 0x3e0cc5f4, 0x3e85b0b8, 0x3ea2c002, 0xbe11c988, 0x3e592906, 0x3e42966b, 0xbe635f3f, 0xbeb806f2, 0xbe7177c0, 0x3ec1664c, 0xbcb5a995, 0xbe6ba37c, 0x3e7eab11, 0x3e9bf4c7, 0xbe267419, 0x3e1445d6, 0x3da646f5, 0xbe54af82, 0x3ec66ff5, 0x3e869580, 0xbdf20061, 0x3d81b493, 0xbe2a5690, 0xbcf01019, 0x3bb00581, 0x3ea35be1, 0x3e310741, 0xbe3a86bc, 0xbe0910ad, 0xbe895ccf, 0x3eea1a67, 0xbea6ce64, 0x3e25bf57, 0x3e8aa768, 0xbc4064b5, 0x3e78b38f, 0xbe1ea606, 0x3e3a9856, 0x3e6aea6a, 0x3e69e01e, 0xbed71cbc, 0x3e23f009, 0xbf181eb4, 0x3d52076e, 0x3d01a474, 0x3d0d6b36, 0x3f053172, 0xbe4b3ea9, 0xbeda207a, 0x3df81dff, 0x3f203e7a, 0xbeef099c, 0x3dba6e7c, 0xbd9380b0, 0xbd727d3c, 0xbda186c1, 0xbd87fa7e, 0xbe18883c, 0x3eccf0d7, 0xbdcf4a5f, 0x3e544d36, 0xbe7cee73, 0x3d753fcd, 0xbe1c31cf, 0x3e317b46, 0xbd3f55dd, 0x3e7b935c, 0x3c8003d4, 0xbdd2d5fc, 0x3df2a5d1, 0x3ec3c0af, 0xbe5cc9f4, 0x3dc3b101, 0x3e6eca9b, 0xbd8a0fe8, 0xbe3e87b7, 0xbd9a107d, 0x3e6ab63a, 0xbbd377d1, 0xbdc0bc7c, 0x3d8df639, 0xbd8fc588, 0x3d9556dc, 0xbec84fd4, 0x3c9375bf, 0x3e40e526, 0x3d93315e, 0xbe9a56bf, 0x3c528a84, 0xbe966ccd, 0x3e100da5, 0xbee1685b, 0x3e51a761, 0x3e11b2d2, 0x3d56a8ac, 0xbe24f0f0, 0x3f02b912, 0x3e1d4c02, 0x3e095451, 0xbdc1a8ea, 0x3e375344, 0x3e0d6f8b, 0x3e23d583, 0xbe252742, 0xbd816dbe, 0xbd7d29d9, 0xbe89eead, 0x3d06e0bf, 0xbec32c0c, 0xbe6787ad, 0x3d97b48b, 0x3e3a379e, 0xbf101308, 0x3ec08e9d, 0x3e22144b, 0xbec341cf, 0x3eb5571a, 0xbd4ec6c3, 0x3cf1579b, 0x3d982e84, 0xbe9bba47, 0x3de3d72e, 0x3d9d9cd7, 0x3deae2a7, 0x3d6bea41, 0x3ea515fd, 0xbd84b4b8, 0x3dfa7ad7, 0x3e59e0c2, 0xbd82be9e, 0x3d5f2071, 0x3cf2eb0e, 0x3e944f2c, 0x3df6e2d3, 0xbf0d8096, 0x3f287ab8, 0x3eecad90, 0xbe556a49, 0x3e2d7070, 0x3e7e2a9a, 0xbe167a53, 0x3ec846e8, 0x3d01ac7a, 0x3d3231df, 0x3f2a5df3, 0x3d5352fd, 0x3e9770ac, 0x3cb7bc43, 0xbc75beea, 0x3e56549e, 0xbe17cde5, 0x3d0225e4, 0xbe368221, 0x3ec568ae, 0xbec7af60, 0xbe30e300, 0xbe21c54a, 0x3e0a3664, 0xbee4b9cb, 0xbf096a82, 0xbc8200cf, 0xbef5e0f3, 0xbec6932b, 0x3ef35917, 0x3dbb7856, 0xbe768de7, 0x3eeb104d, 0xbe2fdcad, 0xbed1c66a, 0xbe7a1656, 0x3e3acb3c, 0x3e5060df, 0x3e012cf9, 0x3d5c6b9c, 0xbd94293d, 0xbdb010bb, 0xbe9a44d5, 0x3e5bddf8, 0x3db1f593, 0x3d7e09c9, 0xbf0802e9, 0xbdaa434b, 0x3e92a4a2, 0x3e2459ca, 0xbe9ebb59, 0x3d9d0f25, 0xbeae35a3, 0xbcdc5bf2, 0xbe6e2789, 0x3ccc861c, 0x3e9995cf, 0xbe4e88b2, 0xbe8c880a, 0xbd9a75b0, 0x3dacd604, 0xbe8ead03, 0xbc8d4ccb, 0xbd9d8920, 0x3dc74e2e, 0xbe806714, 0x3d5e7f01, 0xbf33e1c4, 0x3de2e753, 0xbde67901, 0xbd29b479, 0x3f09d5c6, 0xbd95d58f, 0x3de9f09c, 0xbec456c7, 0xbec64ba8, 0xbe88d4e5, 0x3d886f43, 0xbb8875e2, 0xbd21589c, 0xbc718968, 0x3eaf1e94, 0xbdddf8bf, 0xbec70dae, 0xbe5697ee, 0x3ead7aa7, 0x3ee1b9de, 0xbe60cf15, 0x3de0656f, 0x3edea7f4, 0xbe471409, 0x3dfd3361, 0xbe1bbf0a, 0x3e94327b, 0x3e5c5766, 0x3db51c1e, 0x3e92cf62, 0xbe884294, 0xbea40b8e, 0xbe44361f, 0x3d86ccb4, 0xbf304e41, 0xbcf0b583, 0xbf125543, 0x3e1081ce, 0xbd340d9f, 0x3e92b0a5, 0xbed7fd02, 0x3df4c69a, 0xbd3245b8, 0x3e9f136f, 0xbe6b9506, 0xbe409105, 0x3ea067a5, 0xbda4080f, 0xbec1577d, 0xbf2a9b28, 0x3ce1ca5c, 0xbe687198, 0x3e8bd03b, 0x3e0d27d5, 0x3c13c7f8, 0xbe0364f7, 0x3e3c6f50, 0x3db1fe37, 0xbe711e89, 0x3e1ff3d1, 0xbdc69df2, 0x3e7301af, 0x3e6cc849, 0xbde0ef78, 0xbe1449ea, 0xbe4e6926, 0x3ddc2dd5, 0xbe47ab14, 0xbe4e4719, 0x3f280466, 0x3e6165b4, 0xbf126af4, 0x3f16fb05, 0x3e317e63, 0x3db5f905, 0xbb2c9437, 0x3eadb2ff, 0x3ed4e8ca, 0x3e96b49a, 0xbeac7869, 0xbe75a08f, 0xbe00edb4, 0x3e2e54ff, 0x3e20f666, 0x3ecb6c2c, 0x3e5b6a96, 0xbdfdde0b, 0xbd7d9ffb, 0xbec2a19b, 0x3d537c8f, 0x3d2caa88, 0xbe9ae6da, 0xbeaa6a8a, 0x3da1918d, 0x3edb2984, 0xbd88e5bc, 0x3e886599, 0xbea201a0, 0x3f11895a, 0x3e550742, 0x3dae6ba8, 0xbf246583, 0xbe9bd697, 0x3f1c674a, 0xbd8dfcee, 0xbd176556, 0x3f015715, 0xbe0881cc, 0xbebeb638, 0xbea9051f, 0xbe7e3c41, 0x3e5bb702, 0xbd91ef7f, 0x3ded7c76, 0x3e85cc21, 0xbe748155, 0xbd97fc67, 0x3cb3125a, 0x3ef1eae5, 0xbe3439b4, 0x3de5396a, 0xbe221cfd, 0xbe633d31, 0x3e971fd6, 0x3f236376, 0xbdc7714d, 0x3e8fe373, 0xbd815d1b, 0xbe789db3 }; static const uint32_t in_com2[2209] = { 0x3ebe6c91, 0xbe37cbd9, 0xbd12fa6a, 0x3e4ef2d3, 0x3e30454c, 0xbe6769e6, 0xbea17589, 0x3eaf7734, 0x3f0b8792, 0x3d7756e5, 0x3e302b42, 0x3f023ac0, 0x3e70d8dd, 0xbf55fdcf, 0x3c2ac4b3, 0x3cf6a26c, 0xbcac9784, 0xbebb07b1, 0x3e0cd319, 0x3ebdf825, 0x3b2eece6, 0xbf039617, 0xbc8fc9b1, 0x3ca83625, 0x3d21834c, 0xbcbea34c, 0x3ebd4cf9, 0xbef7f143, 0x3e75cf46, 0xbe068eb4, 0x3cbea61a, 0xbe97783a, 0xbd9d3c01, 0xbed1cbf7, 0xbe9f7ebd, 0xbdebe0c7, 0x3dd06bf8, 0x3cdeba1d, 0xbdb3c5c0, 0x3d1416b9, 0xbe18923a, 0xbe600f0f, 0x3e61dc53, 0x3d9b8816, 0xbd001674, 0x3e2151af, 0xbd9a654d, 0x3dda3543, 0xbdcdce7e, 0xbd4fd5dd, 0x3e9a25b5, 0xbc5ce1bc, 0x3e1a6ef2, 0x3f03a914, 0x3e758ce5, 0x3eb738fb, 0x3cb50feb, 0xbeccbd28, 0xbec0c032, 0xbe55a030, 0x3db9ccf1, 0x3e838fa8, 0x3d260a47, 0xbe753e54, 0xbd203395, 0x3f240652, 0x3c080549, 0x3e469005, 0x3eb9b7f1, 0xbe2e7830, 0x3f197d73, 0xbeb6a5db, 0x3ed87143, 0x3e0164c4, 0x3ebfb85f, 0x3e380624, 0xbe939723, 0x3f264b24, 0x3f1f517c, 0x3f05e590, 0xbf01e1b6, 0xbdbb149c, 0xbe79e961, 0xbe27bcca, 0x3e6f323f, 0x3ee371f7, 0x3df76c3e, 0xbe9f1fe5, 0x3de0869a, 0x3ea2434a, 0x3df63b4a, 0xbea74378, 0x3e4d28ec, 0xbe252a78, 0xbf351446, 0xbe886574, 0xbd4316bc, 0xbd6dd44f, 0x3eaa06a3, 0x3eba6104, 0xbd323c46, 0x3dea58ce, 0x3dfe0412, 0xbf199ec4, 0x3e1f38a4, 0x3ea1bc46, 0x3f2608bc, 0x3eab6eab, 0xbe288e8c, 0x3e4ead37, 0xbe7a6c27, 0xbe0bf63c, 0xbd1762d2, 0x3e9f9515, 0xbde75c4f, 0xbc2ab421, 0xbe542d20, 0x3e0dd7f3, 0xbee75c8d, 0x3dd8e0c2, 0xbed60f0e, 0xbe8abb63, 0xbed92898, 0x3e82bebb, 0xbedbae73, 0x3f214a7e, 0x3e65892a, 0x3e4bde25, 0x3c8eaf85, 0xbf04ed68, 0x3d96c26f, 0x3d591772, 0xbb9e14e8, 0xbda66b65, 0xbe19447b, 0xbe113a4f, 0xbc14987f, 0x3ef3cd30, 0x3f16e0fe, 0xbd7c43c2, 0x3e9686ac, 0x3d7310b6, 0x3dc77e5b, 0x3e33cd9b, 0xba46cbfd, 0x3cc774a9, 0x3f3f0559, 0xbeb86d43, 0xbe6d7fcf, 0xbd9e1d64, 0xbd09ff07, 0xbeb8a7ec, 0x3e84d45c, 0xbf26d377, 0x3e474b08, 0xbe5b4a52, 0xbea3e6db, 0xbda1d0d2, 0x3de7eae3, 0xbb8febb8, 0xbe306e14, 0xbd124738, 0x3ec5bb3d, 0xbd6f085d, 0xbbd75ae0, 0x3e42bb92, 0xbf35b075, 0x3e80edf2, 0xbdc9ece3, 0xbe9091d2, 0xbea26e9a, 0xbe75dcb8, 0x3e2c719f, 0xbe9ef5a2, 0xbdc4135d, 0x3ea00eda, 0x3d91711f, 0xbe93819d, 0xbedf5892, 0xbf1020b0, 0x3eb1cd90, 0x3dc0fd21, 0xbebde007, 0x3e3e36cf, 0xbf26966b, 0xbea6af87, 0x3ec6730c, 0xbead40c5, 0xbe899daa, 0xbe3a9faf, 0x3f04933b, 0xbec56a19, 0x3cb47101, 0xbd60218d, 0x3d96e5e2, 0xbe652b7c, 0x3dccec3b, 0x3e046301, 0xbedb47f8, 0x3da90167, 0x3da55afd, 0xbc9c25a9, 0x3e88e9c2, 0xbd378892, 0x3f3ad850, 0xbefa70b6, 0x3e56a319, 0xbdb88869, 0xbd93ac29, 0xbdbe60cb, 0xbe25bc12, 0xbdd6d3da, 0xbe7eb0eb, 0xbe915ff1, 0xbdda6ad6, 0x3d6e603b, 0xbe6ebfdc, 0xbead3972, 0x3df8b26c, 0x3eab9b95, 0xbe01e0d1, 0xbe097191, 0xbde5e832, 0xbeb6aa8f, 0xbf33e229, 0x3e1f7526, 0x3e6bb469, 0x3ec9a7ae, 0xbea9ddfb, 0xbdefcfc6, 0xbe692bd4, 0xbecf0948, 0x3f0de8b2, 0xbe8c1216, 0xbf039c8a, 0xbd495382, 0xbe94d294, 0x3de8e2ce, 0x3e678214, 0x3ecce26d, 0xbf548a03, 0xbe8b0126, 0x3e387260, 0x3ed18c4b, 0xbe3727b2, 0xbe22b821, 0xbf08d4c4, 0x3ea78d15, 0x3f105212, 0x3eae6bcd, 0xbdc95482, 0xbd227187, 0xbe60ad7b, 0xbe9fef63, 0xbe1e6224, 0xbe199459, 0xbda5363c, 0x3d87c05e, 0xbabbb643, 0xbd1d15f6, 0x3e887924, 0x3e13151f, 0xbe29bdb8, 0x3ddf113a, 0x3e078150, 0x3e0fa190, 0x3e4c7519, 0xbb9e9ea6, 0x3f0b26e6, 0xbda4bd12, 0x3e6960c6, 0x3ecfa611, 0x3eb7c999, 0xbf0fc466, 0x3f0771fb, 0x3d264f36, 0x3ec53194, 0xbeac725b, 0xbe576311, 0xbe956b55, 0xbe8d24c9, 0xbd68923d, 0xbdeae807, 0xbecaac9e, 0x3e1967f8, 0xbe0a1011, 0x3e549e48, 0x3e54b101, 0x3da73650, 0x3f5e6f5d, 0xbdd4f07a, 0xbd81530e, 0xbd90953f, 0xbe2665cb, 0x3e87bd20, 0x3f044cbe, 0x3dcd60c7, 0x3e1c6bc7, 0x3e1978f1, 0x3e88a60f, 0x3f166f78, 0x3d09d88e, 0x3e862009, 0x3ea627e8, 0x3e230495, 0xbd3ff80d, 0x3b49e6d8, 0x3dc5bd7c, 0xbead97fa, 0xbe85b49c, 0x3cc110eb, 0xbdeb607f, 0x3e8eedf4, 0xbe999468, 0xbef3a470, 0xbf3c04d7, 0x3f0f526e, 0x3e981b05, 0x3e3c36c7, 0xbebd9383, 0x3e14a89d, 0xbc3ca7a0, 0x3ca9509e, 0xbd89118e, 0xbebd5640, 0x3d852e4c, 0x3dddb3fb, 0x3eb673a9, 0x3d429407, 0x3f167026, 0x3e49ad20, 0x3da74295, 0x3e13adc8, 0x3e0fe438, 0xbed7c865, 0x3ea3f139, 0x3f14111a, 0x3e71126e, 0x3e81ba18, 0x3ee52aaa, 0x3d8ccc2c, 0x3e97361a, 0x3ecd17a2, 0xbe57c5d8, 0xbd5d111f, 0xbe12e3fc, 0xbe41b2e9, 0x3f0331d1, 0xbeb0fcfa, 0xbafbcac7, 0x3c8ca108, 0xbe31328b, 0xbd00c155, 0x3e076825, 0xbd900e93, 0xbe8dea01, 0x3c394b35, 0xbcf1e44a, 0x3ed85c94, 0xbe7e0210, 0x3e48f5a1, 0x3f686c79, 0x3e4fe0b4, 0xbe92613f, 0x3ec3446a, 0xbc8a7025, 0xbecb5681, 0xbd0785fb, 0xbe3237d8, 0x3ed49fd5, 0x3e97f999, 0x3e93716a, 0xbe037880, 0x3eaaa948, 0x3ef8c4a9, 0xbd440814, 0x3db7c677, 0x3e77b86a, 0xbdf03ef3, 0x3d492e14, 0xbeae618a, 0x3e8adeec, 0x3edd028e, 0x3e1c01d4, 0xbe1349f5, 0xbeb8f99d, 0xbed2102f, 0x3f013c58, 0xbe8d3a40, 0x3f510786, 0x3e1579b5, 0xbebb79f1, 0xbeb746fe, 0x3de69748, 0xbde684d6, 0xbe6a41d3, 0x3e88dba9, 0xbe334fd6, 0xbdc851df, 0xbea78c3c, 0x3ee53734, 0xbd0ddf2b, 0xbe9110b2, 0xbdcd3a3a, 0xbd39b3ed, 0xbe86b4ca, 0xbd8b0843, 0x3d502be1, 0xbe8dc1c5, 0x3cb822fd, 0xbf270361, 0xbeae3a8c, 0xbdd27826, 0xbe41b667, 0x3dcf8d25, 0x3d9fb59b, 0xbdbe7f29, 0x3ddf8e84, 0xbf215ac0, 0xbf089302, 0xbef8f9f5, 0x3e29f42c, 0xbcb14ae6, 0xbe42d8ff, 0x3e55d3c9, 0x3da7233c, 0xbec34f58, 0x3e0fc65f, 0xbd4b284b, 0x3e42f357, 0x3e1ed3bd, 0x3df438aa, 0xbda2a9a1, 0xbea6c39a, 0xbdbe8036, 0xbe895e30, 0xbe2bbb40, 0x3e60009e, 0xbedd8fdc, 0xbe0f7a97, 0x3dcea2e5, 0x3f50aceb, 0xbeacd1c5, 0x3f19106f, 0x3e459714, 0xbe848e94, 0xbeb79db3, 0x3d1033c5, 0x3e546804, 0x3e419549, 0x3eaa2642, 0xbde337ee, 0xbd847684, 0xbe1d048e, 0x3d9ef83c, 0xb9c80fe2, 0xbcb34a5c, 0xbe028db4, 0xbdb2df97, 0x3f0cc758, 0x3df574e9, 0x3f0d3c99, 0xbeb33a13, 0x3be27749, 0xbe18a07b, 0xbed759fa, 0x3e9c91ce, 0xbecf7657, 0xbea6b8d9, 0xbf241995, 0x3e88adcf, 0x3dc7757d, 0xbef061d0, 0x3f1cad9e, 0x3f63dd81, 0x3f1f4ea3, 0x3e2acdeb, 0x3ddc9033, 0xbc3bb2de, 0xbbc463b8, 0xbe1441b7, 0xbe4d1376, 0xbe9dbb7d, 0xbf26e6ad, 0xbe009797, 0x3e673bf9, 0xbc19c7ee, 0x3eb04995, 0x3e9bbbfb, 0xbdf15e5b, 0xbe94f73c, 0x3f008605, 0x3d8648e0, 0xbeb33356, 0xbebd0b74, 0xbe935eb4, 0xbebd3237, 0xbe07010f, 0x3e856d89, 0xbe7a48b5, 0x3d5ae7e7, 0x3e6c3699, 0x3ebf55b8, 0xbe35dfb6, 0x3dcdb164, 0x3eb5ed94, 0xbe6b6f20, 0xbeee785d, 0xbcda1073, 0xbdc3c305, 0x3e136971, 0x3e1cf74a, 0x3ebee106, 0xbc35961f, 0xbe1243b5, 0xbcdfbece, 0xbefdcb1a, 0x3eb1fed4, 0x3e656699, 0xbe0ea8ee, 0xbe5e353e, 0x3e78c52f, 0x3e78a56b, 0x3e077a02, 0xbe184e05, 0x3efb98ce, 0xbe13c494, 0xbee870cd, 0x3e967668, 0xbe5c0e9a, 0xbe727104, 0x3d2dce5e, 0x3de34e50, 0x3dbaf50e, 0x3e077c3b, 0x3f342e93, 0xbe193e29, 0xbe9781bd, 0x3dcc7812, 0xbefbbc9a, 0xbbafc940, 0xbe8bae82, 0xbe8d4f6e, 0xbdeee43b, 0x3d8cd934, 0xbc828376, 0xbcf1b177, 0xbe71b577, 0x3e8765ff, 0x3ea229c9, 0x3e30ec8f, 0xbf13e529, 0x3e36369f, 0xbcefac1a, 0xbd461110, 0x3de50c30, 0x3e71411e, 0xbdb1ba00, 0xbe32389c, 0x3e9cd2d7, 0xbee91c18, 0x3eb03032, 0xbf021f81, 0xbd8ace4b, 0x3d92e0ec, 0x3d7ec9c8, 0x3f671901, 0x3f16e657, 0xbee9ff8b, 0x3dcaa9b1, 0x3e331bdc, 0xbc21f9ab, 0x3e518fc2, 0x3c375f8f, 0xbe13a8da, 0xbed064d2, 0xbe0496f5, 0xbf22b147, 0x3ec2ea5f, 0xbd56342a, 0xbdc76604, 0x3d199244, 0xbd217bb6, 0xbcea3c19, 0xbdc1a3a5, 0x3eca34b7, 0xbe2c46ae, 0x3e1c6228, 0x3e03a8c2, 0x3e5f8445, 0x3ebf39ac, 0x3e6b25bc, 0x3e501a7d, 0x3e07a2e3, 0x3ee37c78, 0xbe8c5189, 0xbe5986b5, 0xbbbb2104, 0x3dd99528, 0x3c471110, 0x3eee599a, 0x3f0c8d77, 0xbe10ef3d, 0x3f254fdd, 0xbe5e0b66, 0xbd3831cf, 0xbeb0caae, 0x3eddd168, 0x3dfcd9bb, 0xbe035e97, 0x3e695758, 0x3e6eb1a8, 0x3e67024f, 0x3e68ff0a, 0xbeed6713, 0xbe800256, 0x3eca20e6, 0xbf4fa8dc, 0x3da7ecd1, 0x3e2ec9e9, 0xbebe524f, 0xbd1b9901, 0x3e31840d, 0x3de5fbba, 0xbd9a1e06, 0xbd38eb4b, 0xbe091745, 0xbe6437d7, 0xbf45aeee, 0x3e682ab9, 0x3d49dbb3, 0xbea030e9, 0x3e840af0, 0x3d99a753, 0x3ecee10c, 0x3e37d702, 0x3ec06693, 0xbebb3d3f, 0xbe0e781f, 0x3e3f9237, 0xbd6ab056, 0x3e9075ff, 0x3ebf5cb4, 0x3f0bfb02, 0x3e4d1161, 0x3e72f879, 0x3e7cd319, 0xbe3071ff, 0x3e369887, 0xbdc1062d, 0x3e91cd15, 0x3d47b21e, 0x3e6b6c0c, 0xbe7d81de, 0x3ee64d1b, 0xba582260, 0x3d363ba5, 0x3d929a82, 0x3dc6adf3, 0xbee51409, 0x3e1931fb, 0x3c6d9c6a, 0xbee866c0, 0x3eca8c66, 0x3c675941, 0x3c8f9157, 0xbdee284a, 0xbe620261, 0xbefa78bf, 0xbe31bb0f, 0xbf0c332d, 0xbeb2366b, 0x3e515a8c, 0x3e6e66d2, 0xbdfbf5e7, 0xbe23bdda, 0x3cb16e0c, 0x3e1c3f08, 0x3e6111e4, 0xbd2b9dcf, 0x3c34c2b5, 0x3eec743b, 0x3ddb39fc, 0x3e8a73d1, 0xbe846ada, 0xbe041886, 0xbe84df55, 0x3e2418e8, 0x3edef896, 0xbe4829c5, 0x3cf43310, 0x3f22e3a0, 0x3ebc060d, 0xbe2c2136, 0x3e867287, 0x3cc4b57b, 0x3cd0a8ac, 0x3e48abe1, 0x3f1afbfe, 0x3e63f60d, 0xbe8b141d, 0x3ee987ef, 0x3f351c98, 0xbe00f6a9, 0x3e19d569, 0x3e133fe5, 0x3f2e304d, 0xbeb96fd5, 0x3e899317, 0xbcfa29c7, 0xbe1d262a, 0x3ea8d54f, 0x3ced4f72, 0xbe139f62, 0xbcde223c, 0x3f14e518, 0xbda98f8b, 0x3f0f11c1, 0x3e4434a1, 0xbe18c9bd, 0xbf183e96, 0xbe2ef518, 0x3f010878, 0xbe88a680, 0xbe93ad02, 0xbd06923c, 0x3e4937ef, 0x3cafec52, 0x3ee3f4f6, 0x3f188cf6, 0xbd0afd2c, 0xbda13fb7, 0x3c461206, 0x3dec08c8, 0x3e16456f, 0x3df49584, 0xbddc7b01, 0xbe44841d, 0xbf146ab6, 0x3ec5a741, 0xbf235800, 0x3eb2c053, 0x3ef52cce, 0xbe02de0e, 0x3e209085, 0xbe043d20, 0xbc2a5f18, 0xbe860821, 0xbeba2f64, 0xbe5c3c7e, 0x3f142c99, 0x3e32e32e, 0x3df43e22, 0x3ef3a062, 0x3e3aaeab, 0xbf01a4b3, 0xbe54e7b9, 0xbeb22ca6, 0xbed354ab, 0xbdc0ff42, 0x3e49bac0, 0xbc7e43c7, 0x3ec431f6, 0xbe9562dc, 0xbdae7647, 0x3e2de7c1, 0xbdf41e48, 0x3d235f0b, 0xbd8dee6e, 0xbdd75159, 0xbf253d3b, 0xbd3122bd, 0x3c61382a, 0x3c9f005e, 0xbbdac794, 0x3ebd316d, 0x3eb6ff37, 0xbe0b00bb, 0x3d99d00f, 0xbe85d1b7, 0x3eaa198b, 0xbdc695ac, 0x3d06666c, 0x3e73917a, 0xbdd27a2b, 0xbe95d059, 0x3b8b1605, 0xbe6de9b5, 0x3dce0572, 0x3e0dcc41, 0xbe1fa370, 0xbf124fc1, 0xbe40a737, 0xbdcaca41, 0xbe594847, 0xbe0508a3, 0x3dc21458, 0xbcd9052f, 0xbe55ef77, 0x3d2d1a0b, 0x3e22917c, 0xbea43ab9, 0xbeb10b80, 0x3ecac4c3, 0x3e8ed5e3, 0x3e915927, 0xbe3d8dd9, 0xbe6d0d4a, 0xbea7b3ef, 0x3db0566b, 0xbce487d7, 0xbee018e6, 0x3e68261f, 0xbf0e28f4, 0x3db2e371, 0xbdcb7a8f, 0xbe76f935, 0xbe414d8f, 0xbe5b2352, 0x3e7c2d80, 0x3edec87a, 0x3e06918d, 0x3e6f5ace, 0x3f717e75, 0xbeb6411b, 0xbbf9fa08, 0xbf00b35b, 0x3ec3dcbf, 0xbe169432, 0x3e8e4c7a, 0x3eb616de, 0x3d5e86a5, 0x3e362bce, 0xbe3fbdc7, 0xbef32dce, 0xbf138e6a, 0xbe6cbf6b, 0xbe3128b6, 0x3c2bf5ad, 0xbe86bc6b, 0x3e21f004, 0x3e6e7116, 0x3e87bd3f, 0xbed3ca1c, 0x3f26ba4e, 0x3dfb8463, 0x3ee13f2a, 0x3ee112a0, 0xbde658bc, 0xbd8bfbe2, 0xbdbf11b3, 0xbcdd6e64, 0xbec5d9bb, 0x3d6ac265, 0x3eb23318, 0xbe37989e, 0x3e702f30, 0xbd378d95, 0xbd87001a, 0xbe4c92fb, 0xbe89b00c, 0xbe4e8166, 0x3e7cfd3e, 0x3f18c0ff, 0x3eaacafa, 0xbe1cb6b4, 0x3f2d0d73, 0xbed30a08, 0xbefeddfc, 0x3ee8dacd, 0xbe9d3a66, 0x3f27c0db, 0x3d687de1, 0xbebd02cd, 0x3eeba754, 0xbf0e8342, 0x3f1dda2d, 0x3e20af35, 0xbd527af6, 0xbdd5c56a, 0xbe45771a, 0x3e2c4a75, 0x3eaf01a0, 0x3e0e1ace, 0xbeaef74f, 0x3db6b3e9, 0xbea7544d, 0x3ebd26be, 0x3ecfc5b2, 0x3d85605e, 0xbe8553d0, 0xbe83e42f, 0x3da2e881, 0x3e04ba41, 0x3e86db09, 0x3c8723ae, 0x3e8e0bad, 0x3d60a22e, 0xbddb6939, 0x3dd075e7, 0xbe396854, 0x3e93b691, 0x3ee87dd9, 0x3e4f90ef, 0xbe501b84, 0xbecbb89d, 0xbec701fe, 0xbca040a2, 0xbeee053d, 0xbf100a7e, 0x3ecb299d, 0xbf1f069b, 0xbe9719ce, 0x3eaf41b0, 0xbefa9ec2, 0x3e986058, 0x3f4b339b, 0xbe2eb7f4, 0xbdd0b609, 0x3e8e4435, 0x3e8cac60, 0x3d1a45e8, 0xbe8d56db, 0x3e81c50c, 0xbed79dc8, 0xbf2bd4bb, 0x3f5a430f, 0x3de248f4, 0x3de9959c, 0xbd9bd15f, 0x3d73793e, 0xbd5214dc, 0xbdbb5cc7, 0x3d67b680, 0x3e1b1856, 0x3e926c97, 0xbdc09c84, 0x3ef75c21, 0x3d0e0e90, 0xbe11c14a, 0xbe211cae, 0x3e439926, 0xbe2a2e02, 0xbf1d4d68, 0x3c1d59c7, 0xbefb88b8, 0x3e82ac74, 0xbea84e2b, 0x3e77cbac, 0xbdfe96ef, 0xbe4084e8, 0x3ebff073, 0xbf62c6d0, 0xbea1ab0b, 0xbe0a944f, 0x3e9823d5, 0xbd810079, 0xbcca7ada, 0xbf2d79a1, 0xbc715930, 0xbe689e5e, 0x3e7903af, 0xbd065715, 0xbcb6053d, 0xbe5c4494, 0x3e370ee0, 0x3e6deb1f, 0xbec147fe, 0xbe8a15c4, 0x3daee5d6, 0x3f236a7e, 0xbd8bc3c6, 0xbe66afdc, 0x3e0c1b45, 0x3e458d00, 0x3e8f57c4, 0x3e5b4897, 0x3d7c6e53, 0x3e77be9f, 0x3e424e88, 0xbc16bef9, 0x3ed44c49, 0x3ce42901, 0x3dd83c87, 0x3dcd1722, 0x3f02425b, 0xbee75271, 0x3dff680c, 0x3dcd20cd, 0x3dfe7509, 0xbd6e3013, 0x3e491856, 0xba4412e6, 0xbeb92184, 0xbeebf3aa, 0xbe6ba166, 0x3e1c8867, 0xbcbd1023, 0xbe141588, 0x3de8f600, 0x3eba69d5, 0xbe924835, 0xbee8e237, 0x3eb8678c, 0x3edb543f, 0xbd6fa366, 0xbe0e024f, 0x3e010935, 0x3d8dfabd, 0xbdc3ef19, 0x3cc48ee2, 0xbc710ba4, 0xbe656dd3, 0x3d6aa6c3, 0xbd3f2e6a, 0xbe2a239c, 0x3ef47cb5, 0xbdc1277f, 0x3f2f9817, 0x3eb28741, 0x3eb59d76, 0xbeb218c9, 0x3d33e96d, 0x3e23b619, 0x3e8e4022, 0xbed23632, 0x3b82cdc5, 0xbeede377, 0x3df8da93, 0xbd25075d, 0xbed98ce3, 0x3e93aba5, 0xbc21f075, 0x3ed1946b, 0x3f6938f2, 0xbe7a4b6f, 0xbd1142dc, 0x3e819654, 0x3e5641a7, 0x3e6fc6f5, 0xbe3b3a70, 0xbd6f109f, 0x3edb652a, 0x3d785beb, 0x3e382525, 0x3ebe5744, 0xbed9b98c, 0xbe650d39, 0x3e85e526, 0x3d04c110, 0x3da758d1, 0x3d3932a8, 0x3e6fee66, 0xbe0317f1, 0x3e11171c, 0xbf183caf, 0xbea1e9a5, 0xbe193f6e, 0x3eabb490, 0x38194055, 0x3debc2bf, 0x3dde0160, 0x3db5f98e, 0xbeb1b91f, 0xbe829aaa, 0xbec8fead, 0xbe51b5c6, 0xbf095d9a, 0x3ef99860, 0xbde0d575, 0xbe0b480d, 0x3d9e0f78, 0xbee0c3bf, 0x3df27ec3, 0x3f1ca5d4, 0xbdb2f1d4, 0x3e08ac44, 0x3ee81bbf, 0xbdcc5210, 0x3ea9e4af, 0xbc9b7240, 0xbeecea6f, 0xbea4ffd0, 0xbd005d3c, 0x3ef1651d, 0x3ec06e98, 0x3f0a53fa, 0xbeb827c3, 0x3c38391d, 0xbe63f7db, 0xbf0f2122, 0xbd702afb, 0xbdc6e390, 0xbdcdba34, 0x3bd64b11, 0x3f2401aa, 0xbd1348e6, 0x3d91f523, 0xbf0511e4, 0xbe3b4f67, 0xbc8c438b, 0xbeccc6b1, 0x3e452ec0, 0x3eb29c46, 0xbd9c301d, 0xbec15809, 0x3e77decf, 0xbd95624b, 0xbe89d233, 0x3e598d6a, 0x3ea85400, 0x3e827716, 0xbf47efbf, 0xbe844a18, 0xbdfab545, 0x3dbccf2b, 0x3dc32735, 0xbdd019f1, 0xbd93ca4d, 0xbf2e2613, 0x3e6b8ba6, 0x3da2d82c, 0x3e32c6a9, 0xbe764897, 0x3d8e9357, 0xbe346730, 0xbe928bc1, 0x3e834846, 0xbd302834, 0x3e07d469, 0x3ecf1a37, 0x3edc510b, 0x3d06137d, 0xbe258359, 0xbe91ff30, 0x3f2bd328, 0x3f144115, 0xbeb50064, 0xbe2d71e2, 0xbeb527e0, 0x3e3b59e9, 0xbf0c3bcf, 0xbe31ce7c, 0x3f1b58e0, 0x3e4795d3, 0x3e4e5f83, 0x3e3ec23c, 0xbe2b0598, 0x3e4a4302, 0xbe7ada41, 0xbe6503a0, 0xbe864f50, 0x3d73b282, 0xbbda92dc, 0x3d07dc32, 0xbcd23939, 0xbdbb3bd8, 0x3d551467, 0x3e95d444, 0x3d8995f6, 0xbddd331c, 0x3d451bed, 0xbccea730, 0xbc7d9f56, 0xbe8574e7, 0x3d854619, 0x3ea51dc1, 0x3e911cf5, 0x3dc76c92, 0x3e6abaf9, 0x3e229380, 0x3d2cf51f, 0x3eb30907, 0xbea03577, 0x3eac4e5c, 0x3e882fbb, 0xbe48f91c, 0x3ead1eb6, 0x3e833eb4, 0xbdc12038, 0xbe8fd58b, 0x3f03fe46, 0xbe6ec786, 0x3ddee7d6, 0xbc8facee, 0xbeb85936, 0xbf4e44b7, 0x3ea92ff9, 0x3cab7bf2, 0xbd317c9a, 0x3e18e1fc, 0x3c896ebe, 0x3e99553b, 0xbe5a6da3, 0xbde9b620, 0xbed4b8c0, 0x3eaa37d1, 0xbcfef3dc, 0xbf16e04f, 0xbe8c1797, 0x3d05cb6e, 0xbe413719, 0x3e92e6d7, 0x3ece0a95, 0xbbf7b81a, 0x3ebfbd68, 0xbe9fa2a5, 0x3e21fc9a, 0xbde4e4b3, 0xbe890df7, 0x3d57f84f, 0xbe47a0b6, 0x3dab3892, 0x3e85a011, 0xbe6fb2b8, 0xbf19326a, 0xbe8c4702, 0x3e00b0e8, 0xbe8a1087, 0x3eed740f, 0x3e8d410e, 0xbe001a5b, 0x3c1b26b2, 0xbe0c90ce, 0xbe844ac1, 0xbeab006f, 0xbf0be066, 0x3e164633, 0xbe148ef8, 0xbd566683, 0xbe365cf1, 0xbe3d87d7, 0xbf6ed2cb, 0x3e54054f, 0xbd18f27e, 0xbecb9eb9, 0xbf049722, 0x3e849211, 0x3dc71d74, 0xbd7a2087, 0x3e80c22b, 0xbe28f470, 0x3dcaf254, 0x3ec620ee, 0x3dfb152f, 0xbef0f493, 0x3e890401, 0x3f118c6e, 0xbeac7c3f, 0x3e290243, 0xbe4572fc, 0x3e9c855d, 0x3e6e3d0a, 0xbea085a5, 0x3ec69a8e, 0xbe5500ed, 0xbe957eb7, 0x3d9389cd, 0x3db27187, 0x3ebe8cea, 0xbee820e5, 0x3ec62139, 0x3e782443, 0x3e413069, 0x3da2b86e, 0x3e9c1d78, 0x3f1bc641, 0x3bd3a187, 0xbf03a685, 0x3d332e96, 0xbc23ba01, 0x3e6e1749, 0xbdc94e21, 0xbd5c3f84, 0x3e022bc2, 0xbdae6ad4, 0x3f50fbd8, 0xbe49dfd4, 0x3eacef23, 0x3cd2d2ee, 0x3d882ee2, 0x3e9b6ee3, 0xbe2000a2, 0x3c7b279c, 0x3f44678d, 0xbd873cb2, 0x3e853190, 0xbec6dc30, 0x3e7e51c6, 0x3d32d023, 0x3e83ced5, 0x3e2d9ba0, 0xbeb6da04, 0xbe84d7f4, 0xbe6d05a7, 0x3ed1e3bd, 0xbee2988c, 0xbdbbba40, 0xbc1f4ed0, 0x3de48967, 0xbe247309, 0xbf172156, 0x3e885b9e, 0x3e8ca767, 0xbeadbadc, 0xbe52fc64, 0xbcada081, 0x3db4d9dd, 0xbd2d9870, 0x3ee6e66e, 0x3df03ae9, 0x3eaf8025, 0x3c21792f, 0x3e05f1de, 0x3c7cb5f2, 0x3e161d48, 0x3d8940c0, 0xbe1d47e9, 0xbddcdd6c, 0xbdd3a91e, 0xbef048c0, 0xbe08b08c, 0x3d52f700, 0xbdfffd00, 0x3cc27ce4, 0x3f26eb72, 0x3ed56fd6, 0x3e9899be, 0xbda6560d, 0xbedc88e4, 0xbe3418e7, 0xbeaf5c4b, 0xbdda0f63, 0x3ec93357, 0xbf1ec2c4, 0x3e827264, 0xbe941d8f, 0x3f1ffe19, 0x3e53a792, 0xbdb81111, 0x3e0a0d43, 0x3e3de41a, 0x3eb2fca4, 0x3efa040d, 0xbe5a4057, 0xbe4dbc73, 0x3dca25af, 0xbd46ca03, 0x3e33a919, 0xbd441f13, 0x3e916164, 0x3e1c283f, 0xbe999496, 0x3c9dc44b, 0xbe889a7a, 0xbe0a27b2, 0xbeeec0fe, 0xbd8f2b27, 0x3f199d70, 0xbed66887, 0x3ddbafe9, 0xbcf56519, 0xbda8ee8b, 0x3ded890f, 0x3dbacd6d, 0x3f5e3e13, 0x3e0b557d, 0xbcf4a17d, 0x3de78b42, 0xbe4e4d93, 0x3ec2b04c, 0x3f316175, 0x3e1ec3bb, 0x3d3559dc, 0x3df4201f, 0x3f286c5e, 0x3db003f7, 0xbe97b29c, 0xbf0f7545, 0x3f0eeb46, 0xbe8c1a65, 0x3eb26ffb, 0xbd8ed373, 0xbf05d902, 0x3e10d4e1, 0x3d223c3b, 0xbe859ee4, 0x3eebe96a, 0xbe28e57d, 0xbf2b2804, 0x3cead9d2, 0x3e2da6d7, 0x3ed249b4, 0x3e56f49e, 0x3ca0e8e5, 0xbeaf5103, 0xbe2324f3, 0xbe592427, 0xbef01ae9, 0x3ef9f95b, 0x3dc62886, 0x3e7f43a4, 0x3cea9422, 0x3e3962bd, 0x3e1b1ecc, 0x3dcf5cbc, 0x3ecd4115, 0x3ee39ac6, 0x3e836426, 0x3d804d2b, 0x3f283fbd, 0xbeab012b, 0xbe126938, 0x3e9c5445, 0x3e42f2fa, 0xbe31e9d3, 0xbe3a8747, 0x3e05f358, 0x3e541ce5, 0xbe3230ef, 0x3f147bf3, 0x3e5ac51a, 0xbec810d2, 0x3c5c4044, 0xbd65f6b2, 0x3c6d3887, 0xbee00410, 0x3ef8f190, 0xbe690dec, 0xbeb55083, 0x3ec099b7, 0x3dcb4ebd, 0x3ed620de, 0xbdca4f9c, 0xbde4c441, 0x3edc0b10, 0x3e738351, 0xbe21e46c, 0x3e004ec6, 0x3ec661e5, 0x3ed0479d, 0xbd1d28eb, 0xbe5b8ead, 0xbef3bd50, 0xbd28c1ed, 0xbe634661, 0x3ead5f99, 0xbf1d379d, 0x3ec88ec4, 0xbe181208, 0x3e224b5e, 0x3da9d666, 0x3e41ed38, 0xbf139d82, 0xbe1f7d29, 0xbf0bb6b8, 0xbe065c01, 0xbd51d3cd, 0xbed11a28, 0x3eb938a2, 0x3e4684b5, 0xbd0b8976, 0xbf063169, 0x3ede866d, 0x3aa6caca, 0x3dc882e0, 0x3e72e321, 0xbdaf3476, 0x3e5e7c9c, 0xbd1bf106, 0x3e7d9bfb, 0x3e0f7c97, 0x3d58d5bb, 0xbeac27b5, 0xbe0fa168, 0x3f12c6b9, 0x3e822002, 0xbe45e600, 0xbeb19f9d, 0xbd6fc092, 0x3f10a0fd, 0x3ed98900, 0x3db3edf4, 0xbe4e5ee9, 0xbddd3715, 0x3e13f8e2, 0x3daeb470, 0xbe8cc0f1, 0xbe874d5a, 0x3e1da412, 0x3f06bbae, 0x3e2af2ca, 0xbd97abe1, 0x3e9146c7, 0x3eb294b5, 0x3ecd6cda, 0x3f0850a2, 0xbd6b44eb, 0x3da65a7f, 0xbe3d9eed, 0xbc8d03e9, 0x3c12ea5a, 0x3d7b38b4, 0xbefeb4d2, 0x3f4e365e, 0x3e60c1c0, 0xbea912a7, 0x3e5755e8, 0xbed19b70, 0x3f23573a, 0x3e1c4354, 0x3ebd2138, 0x3e8c80b3, 0x3e65753a, 0x3dd74db4, 0x3e928f81, 0xbde40557, 0xbd1ca6db, 0x3e6cf069, 0xbe072ad8, 0x3cfd375b, 0x3e2717f2, 0x3dca8ecc, 0xbe6a29e9, 0xbd6c509d, 0x3eda8462, 0x3e66444a, 0xbe9ae6cc, 0xbe5a1190, 0xbf800000, 0xbd0e403d, 0xbe45d770, 0x3e0126c2, 0x3d2379d2, 0x3e10114c, 0x3e6cfc1c, 0x3e46dc2e, 0x3f473cc0, 0xbf586fdb, 0xbcc8155d, 0x3e9a6f49, 0x3e2dead9, 0x3f247a33, 0xbe9ea69a, 0xbea1fb1e, 0x3dfab0ff, 0xbeff135d, 0x3e3bf9bd, 0x3e9fcb07, 0x3eca1ef5, 0xbe8d0132, 0xbe15a8bd, 0x3e948104, 0x3e893dc8, 0x3eec4478, 0x3ee2500e, 0xbc9c38eb, 0xbde75750, 0xbe5bf6b1, 0x3e643f32, 0xbf10801e, 0xbe802934, 0xbe126ec1, 0x3f190a02, 0x3f779fb3, 0xbe4dbc8f, 0xbe9457ec, 0x3f4c1720, 0x3e4e6a3d, 0xbe8e40d4, 0x3e050844, 0xbd34e3bc, 0x3e9a1322, 0x3f20587b, 0x3e751603, 0xbd60cdb9, 0x3e8336c5, 0xbecc1171, 0x3ee88f2d, 0xbed3514b, 0x3f07fdca, 0x3e71a12b, 0xbef98b93, 0xbeb7dcac, 0x3da53789, 0xbe5648d2, 0xbed9bb6e, 0xbe16fbb3, 0xbe38940f, 0xbebbebb1, 0x3cee669b, 0xbe1fc284, 0x3d18bd2d, 0x3e477a6d, 0x3b9d6ea8, 0xbd3aefcf, 0xbe802a74, 0x3e43e637, 0xbe163f20, 0x3e5f8d35, 0x3c5c746b, 0x3eb02aff, 0x3d87f581, 0xbe6dcdcf, 0x3e4dfa56, 0xbe6f79ed, 0x3ee500bf, 0x3ebe3fe6, 0xbeabcd7e, 0xbe6e59f1, 0x3e56400e, 0xbd9edb72, 0x3ebdc363, 0xbdc87a82, 0xbe506c78, 0x3e21b434, 0x3e999499, 0x3e8e89a0, 0xbdb478ae, 0x3e29a6a4, 0x3f5a7f4c, 0x3d85badb, 0x3e78b94c, 0x3dd0ca94, 0xbe29e2e0, 0xbd7b96d8, 0xbe79d27a, 0x3d7eba5e, 0xbeadb39f, 0xbe027a35, 0x3c697f1a, 0xbeea9c5e, 0x3d7b082a, 0x3ed932a2, 0xbe64817c, 0xbca07755, 0xbd96d03e, 0x3d9c13da, 0xbd937322, 0xbc0636dc, 0xbdebbd71, 0x3d3d7157, 0xbcbeb425, 0x3e8d50e4, 0x3d5fe575, 0xbe86d8ad, 0x3eb3ab21, 0xbde5f7ad, 0x3cdffe34, 0xbe93dc11, 0xbe84a59e, 0x3e9cccc4, 0xbe543d99, 0x3c8f6f7e, 0xbcf1099f, 0xbe40dd2e, 0xbd17c14a, 0xbe0677c2, 0xbe5f5073, 0x3e6d3f54, 0xbe6d0a25, 0x3ee8e263, 0xbe9346bf, 0x3ee6b7a7, 0xbe13d11b, 0xbf1b04eb, 0x3cc98887, 0xbd0d0478, 0x3d902793, 0xbbb91f90, 0xbeb82a8f, 0x3db3c143, 0xbc92ba02, 0x3e2a8423, 0x3f211a54, 0xbee8796e, 0x3f144099, 0x3bfbd117, 0x3e0cd89a, 0xbec65e80, 0xbe1e6c6a, 0x3e1fba41, 0xbdad88dc, 0xbc679e74, 0x3e320948, 0xbf1bd8b0, 0xbe24b313, 0x3f2aab61, 0xbdd4a727, 0x3dc050bd, 0x3cf601a3, 0xbeea6de4, 0x3e37f62d, 0x3e87b07d, 0xbe4c1922, 0x3d649bcc, 0x3f1aef8a, 0x3d433346, 0xbe663803, 0x3e3d1afa, 0xbe27743e, 0xbdd82e2d, 0x3eb7de61, 0xbcb0db87, 0x3ef65adc, 0x3e19a947, 0xbe9fbd49, 0xbba58ef9, 0x3e0e67a8, 0xbe6fdd05, 0xbecbfc5c, 0xbd95a1a1, 0xbf0ad55e, 0xbe245514, 0x3e158c2c, 0x394ab101, 0x3d93b505, 0x3d9201af, 0xbf4ea106, 0xbdaac048, 0xbd886c38, 0xbbee2ec0, 0x3eb5d9e9, 0x3d4aa56b, 0xbea85161, 0xbf0d5a07, 0x3e79000d, 0xbe6f0229, 0xbb8709c0, 0xbf3e1186, 0xbed87946, 0xbd78f1ed, 0x3d1ca8cd, 0xbdc3a6c7, 0x3e066d55, 0xbdf80205, 0xbd49a6dc, 0x3e37d7b8, 0xbf0f5e6a, 0xbed7bbec, 0x3ecfcb1f, 0x3e8b08b9, 0x3e0a2058, 0xbe3ca35c, 0xbd7b207e, 0xbe2735d6, 0xbe5902b3, 0x3ea15d82, 0xbe8e4433, 0xbe37df12, 0xbe44b953, 0xbca114da, 0xbd4619cf, 0x3e9b61de, 0x3f217539, 0xbbb07bb5, 0x3ea7f731, 0x3dfc0e42, 0xbe0301e6, 0x3e44a82b, 0xbece8ce1, 0x3e6ad041, 0xbf10a9c6, 0xbd2396b5, 0x3ec866e1, 0xbe3bd144, 0x3e3117a0, 0xbeb4e684, 0xbd5c13c2, 0x3ed333bf, 0x3e019b53, 0x3ccd465d, 0x3e0ecc70, 0x3e30e25b, 0x3bdc763d, 0x3f0073e5, 0xbe77f9b6, 0xbf17e39b, 0x3e31c6d3, 0xbd90ffa3, 0xbe849ce7, 0x3e812bfd, 0xbe7997e5, 0x3e92a95b, 0xbe6b3d43, 0x3de89f8c, 0xbeb18827, 0xbf19ade3, 0xbe8a7a68, 0x3e1ef934, 0xbe963f89, 0x3c9cd853, 0xbe115c05, 0x3e7bbcf9, 0xbf0e923b, 0xbe1d623b, 0x3ec100ec, 0x3ede9c64, 0x3e56fd5f, 0x3e044126, 0xbdee1588, 0xbdc1eaa9, 0x3e3ba6ac, 0xbefc0834, 0xbee9960f, 0x3e91d376, 0x3e95a2ff, 0x3ea80366, 0xbeceffa7, 0x3e1fafd0, 0x3e9f1267, 0xbe23b12b, 0xbf1f7117, 0x3e40831b, 0xbf05ebd9, 0xbf3d4ed6, 0x3e0c98d0, 0x3e8eaae2, 0xbea0974f, 0xbefb0b02, 0x3ecbe236, 0x3ee72b15, 0x3dff68ee, 0x3eadcb65, 0x3eb28531, 0xbecb9295, 0xbc60ec64, 0xbd111292, 0x3e6f441a, 0x3eb75d42, 0xbf0eaeb5, 0x3a247e79, 0x3e81bce3, 0x3c3b062d, 0xbe58265f, 0xbe6d36df, 0x3e2a632a, 0xbdaf8468, 0xbf0f24d8, 0x3d1e91c8, 0xbe7c0209, 0x3d32e95e, 0xbe6a041e, 0xbf27821b, 0x3ef77181, 0xbdfddfbb, 0xbeb0c6e2, 0x3cec306b, 0x3ee1a375, 0xbc907448, 0xbdd5b1ca, 0x3ce799ec, 0x3db8fd54, 0xbef4be28, 0x3dc63515, 0xbf4a394b, 0x3c9caccf, 0x3e5e81e9, 0xbec43f1c, 0x3c25c36f, 0x3d7c066e, 0x3d2108a0, 0x3e46c1f4, 0x3e3ff185, 0xbe1284c0, 0xbe6d489f, 0x3e19e5d9, 0x3ddf1653, 0xbde2bdd6, 0x3f3f6724, 0x3e8824de, 0xbe184377, 0xbec47516, 0xbf005415, 0xbe42f0cb, 0xbddedaf7, 0xbe0d503c, 0x3f00c3fc, 0x3e3e242d, 0xbf3e00d9, 0x3e616987, 0x3ecc34e5, 0xbe5e2384, 0x3e91380f, 0xbe8e9807, 0xbce3f457, 0x3e5e125c, 0xbe75c7dd, 0xbf5befa0, 0x3d6e6950, 0x3ed78c09, 0x3dfac5a9, 0xbe1b459f, 0xbd4a359d, 0xbe2ae4b9, 0x3eaa8d0d, 0xbe24d597, 0xbe0e4adc, 0xbf16970b, 0x3dc05c40, 0x3e911be6, 0xbe027032, 0xbe52eba4, 0xbe74c8f9, 0xbebf01ee, 0x3f0fe01e, 0xbe9c98b2, 0x3dd02eb6, 0xbe5f0e93, 0xbe84d504, 0xbed47671, 0xbf423616, 0xbd8ab8d6, 0x3dc37689, 0x3e93ebdb, 0x3e477edd, 0x3ea91bbb, 0xbf22444b, 0x3ef74f77, 0xbe81bd6d, 0x3e245d9a, 0x3ec51a88, 0x3d678673, 0x3b09498c, 0x3e3fd4f7, 0x3d4c28ab, 0xbe0df759, 0xbf2f6a0e, 0x3e70ede4, 0xbdde285e, 0xbee955ea, 0xbea00445, 0xbf039496, 0xbcb8a7c0, 0x3e536d1e, 0xbecc5213, 0x3e9df2b3, 0xbe7cb6b5, 0x3e9a8142, 0x3e3b2685, 0x3ecce8c2, 0x3ca951a0, 0xbe619ce6, 0x3e88ffdf, 0x3eef23ff, 0xbe02aae8, 0x3e2a9352, 0xbed26d00, 0xbe885ab4, 0xbe28ac1b, 0xbd3e1c04, 0x3eb2c80e, 0xbe91e632, 0xbd06814f, 0xbf0a5ec8, 0x3b9f5a89, 0xbe8d26e9, 0xbee052d4, 0xbe25ac06, 0xbeabc924, 0x3ea831aa, 0x3cece0e8, 0xbf0355ba, 0xbf2098b7, 0xbd25b3b5, 0xbefad837, 0xbe655543, 0xbd9b3144, 0x3df7648d, 0x3f076fbd, 0x3ee3295a, 0xbed84ae3, 0x3ef21280, 0xbe5cfed3, 0x3ee6b863, 0xbe6ee7f8, 0xbe37a21b, 0xbe97060b, 0x3ec02b07, 0xbf06f41b, 0xbea5e842, 0xbe527903, 0x3f063a5e, 0xbce1c914, 0x3b99aed8, 0xbdb31a52, 0x3eca47d4, 0xbee1404e, 0xbdb4598e, 0x3ed628a3, 0x3f0a91a9, 0x3e9822a3, 0xbdc0af90, 0x3e8f9e3c, 0x3dc7aa26, 0x3da63f48, 0x3e843bd3, 0xbf1b7395, 0xbd84354e, 0xbf38f04f, 0x3df78344, 0xbe837da5, 0x3d0a6791, 0x3de57f9c, 0x3d4c53e3, 0xbd059ce3, 0xbe89fb4c, 0xbd180a11, 0x3f175a09, 0x3e57b343, 0xbe5c4556, 0xbe9f021c, 0xbe890237, 0xbee2a3db, 0x3f2b97e1, 0xbd97611a, 0xbde120ad, 0xbbce5a2e, 0x3e684bdc, 0xbd9febb7, 0x3ed48582, 0xbdcb7478, 0xbd928566, 0x3ed30a65, 0x3e238e44, 0xbda7f170, 0xbe3028ac, 0xbb42d3d8, 0xbdb3af47, 0x3e10e23f, 0x3f4876a0, 0x3e5c6068, 0x3daabbb5, 0xbf313df9, 0x3d5861e5, 0xbe3faa2a, 0xbdbc726a, 0x3c07451b, 0x3d08d8da, 0xbef6a683, 0x3e881039, 0x3e88ea6d, 0xbe526ac4, 0x3c5c8ff2, 0x3dae898b, 0xbef7eac7, 0xbe82b2f9, 0xbd1cd279, 0xbe62f7be, 0x3d160808, 0xbddd5df7, 0xbe94455e, 0x3e22af94, 0xbc8442ed, 0x3d0fbcef, 0x3eb082c9, 0xbd9af815, 0xbef91209, 0xbdf8288c, 0xbdeac24b, 0xbebee0fe, 0x3df64b4c, 0xbe017543, 0xbe18123e, 0xbca90163, 0x3d8b86f5, 0xbf19d3da, 0xbea2438e, 0xbf227581, 0xbe849881, 0xba90a23b, 0xbe607063, 0xbea5de27, 0x3e455991, 0x3e91c172, 0xbe4c6da5, 0x3d987250, 0xbee6c32c, 0x3ec0a722, 0xbf57128d, 0x3e0e4c9b, 0xbe5c80e4, 0xbe33415d, 0xbeaa4e07, 0x3efd57e6, 0x3ef6af6a, 0x3e518ca3, 0xbea541dc, 0x3d7c081f, 0xbd9f8c9f, 0xbe7f4229, 0xbdf4a76f, 0x3e5ff475, 0xbe7bb27b, 0x3e4892e6, 0xbc9c963c, 0xbeddf0f5, 0xbe56ec13, 0x3f204c55, 0xbe21dae8, 0xbe675546, 0xbd237eb1, 0x3ea7bca2, 0x3e12d0fb, 0x3f4c0eb2, 0xbdb3037c, 0x3e72397a, 0xbee3b6b3, 0xbdf7ae96, 0xbd8a7f92, 0xbd995203, 0xbdce40e6, 0x3e2ad3f4, 0xbf615118, 0xbda38022, 0x3eaa5b62, 0xbe06c85e, 0xbe19d26f, 0xbe635d4c, 0xbe143d5d, 0xbe1f0262, 0x3d24f1c1, 0xbea36f3a, 0x3edabb90, 0xbe2bd13e, 0x3ef34a42, 0xbe48f3fe, 0x3f229d6d, 0xbdb3b259, 0xbe9548df, 0x3f0c43d1, 0xbecc0020, 0x3e1e7e04, 0xbe5c17a3, 0xbf571fa9, 0x3f163116, 0x3e79735f, 0x3b9170ff, 0x3f1381b9, 0x3ef35933, 0xbf2b9496, 0x3e80c25c, 0x3bbcf0e3, 0x3e9904ca, 0x3d806a33, 0x3e5760f2, 0x3ec8cf50, 0x3e345ef8, 0xbec6ed00, 0x3eaac30b, 0xbe5beb29, 0x3d29b0da, 0xbe53607c, 0x3df68fba, 0xbd8b48b7, 0xbe32dbb4, 0xbe9746e7, 0x3ed7dbf7, 0x3e73d502, 0xbddbae3f, 0xbde6cab6, 0x3d94f332, 0x3ec5d8d0, 0xbf1ca9d0, 0xbe5332d2, 0x3e44368f, 0x3be9cdd6, 0x3ee34d3b, 0x3e28ec02, 0x3e9abbfa, 0xbe39b7e4, 0x3eca7a3e, 0xbeb82934, 0xbe23595c, 0x3e168c5b, 0xbf241361, 0x3d949276, 0xbea4a7d0, 0x3e34af3e, 0x3e809848, 0xbe2631d2, 0x3e5a5ad6, 0x3f4b68e2, 0xbebde45b, 0xbe91f698, 0x3e274b88, 0xbf164d6f, 0xbe010fe8, 0x3eec3ad9, 0x3ce25c25, 0x392b81e8, 0xbe237937, 0x3ec4fcd4, 0xbe24d40c, 0xbe258b2c, 0x3d24d683, 0xbf0d557c, 0x3e32db50, 0xbedcac57, 0xbe47a6a0, 0x3e545a28, 0xbe7670b3, 0xbccf734e, 0x3ce0ad17, 0x3cef3469, 0xbe6487d4, 0xbdae0db0, 0xbf08aca4, 0x3d8b2e40 }; static const uint32_t in_inv[3111] = { 0x3f000000, 0x3f3504f3, 0x3f3504f3, 0xbf3504f3, 0x3f3504f3, 0x3f4e034f, 0xbe9f0931, 0x3f018149, 0x3f018149, 0x3f4e034f, 0xbe9f0931, 0xbe9f0931, 0x3f018149, 0x3f4e034f, 0x3f800000, 0x40000000, 0x40400000, 0x40800000, 0x40000000, 0x40800000, 0x40a00000, 0x40c00000, 0x40400000, 0x40a00000, 0x41100000, 0x41200000, 0x40800000, 0x40c00000, 0x41200000, 0x41800000, 0x3f7a83e4, 0x3ea8f734, 0x3f73a5f4, 0x3e9c2092, 0x3f6cb49e, 0x3f008366, 0x3e70de4c, 0x3e3dc2f4, 0x3eefeef6, 0x3f7494f7, 0x3f789060, 0x3f232bed, 0x3f1eac64, 0x3f5e3498, 0x3ec30596, 0x3f48a0a1, 0x3f5da22f, 0x3f653943, 0x3f55dde3, 0x3f5af838, 0x3ece974a, 0x3f244f5d, 0x3d754003, 0x3f203bc5, 0x3d0bc855, 0x3db12458, 0x3ef7607c, 0x3f22d752, 0x3e374470, 0x3e690abb, 0x3d998beb, 0x3ec26330, 0x3f6ff024, 0x3f5592da, 0x3e076cce, 0x3ea10d7c, 0x3ee9def0, 0x3f7fdcbe, 0x3f678434, 0x3de1dc0e, 0x3ec2cc4f, 0x3f079885, 0x3e4e79ee, 0x3eefbfc6, 0x3ee89c80, 0x3ebbb7fa, 0x3d50f388, 0x3e436588, 0x3f2226d5, 0x3eca9ef5, 0x3f1fb13a, 0x3f62ab04, 0x3f74432d, 0x3e9eeaa7, 0x3e83dc6a, 0x3f21a522, 0x3ed956e2, 0x3e061672, 0x3f4cca1d, 0x3e08e6d1, 0x3ef57b20, 0x3f04edd5, 0x3ec3178b, 0x3f1e1188, 0x3f3f8ed2, 0x3e16787d, 0x3f6dcf57, 0x3edca3a5, 0x3f0219db, 0x3f543ada, 0x3eb74f51, 0x3f7fdf4c, 0x3f5a1998, 0x3e8c3bf7, 0x3f2f9703, 0x3d32d616, 0x3e972607, 0x3eef6ff4, 0x3d532d1e, 0x3e576b3c, 0x3f1b837b, 0x3f11feda, 0x3e8fed85, 0x3f7aae19, 0x3dc224e1, 0x3ea35611, 0x3ecbfbbd, 0x3eb32d0a, 0x3f35c2b1, 0x3edcfa48, 0x3ee5338f, 0x3d991f63, 0x3d69bae4, 0x3e299fa1, 0x3f45ea46, 0x3e0b05fb, 0x3f359674, 0x3f5fb3b7, 0x3e95b057, 0x3b04baba, 0x3ec92fb2, 0x3f052ab7, 0x3d584a94, 0x3f4c488c, 0x3f1d0e24, 0x3f027a85, 0x3d328000, 0x3f47d08d, 0x3f75e8b4, 0x3f0931a9, 0x3e5d4cba, 0x3e09539c, 0x3e674795, 0x3f417f84, 0x3eae6730, 0x3f1b03c0, 0x3f0988f4, 0x3e13671b, 0x3f3016ad, 0x3e895c21, 0x3ec5c875, 0x3eb4dad3, 0x3f1bea2d, 0x3f6fd849, 0x3e398cc1, 0x3f2541ea, 0x3e0e8295, 0x3f27296f, 0x3f24f10b, 0x3f2982cb, 0x3f772086, 0x3f027ac8, 0x3f6bb4f6, 0x3eff6f4c, 0x3f0d028a, 0x3917bdd5, 0x3ecda07b, 0x3e4e9186, 0x3e3190d1, 0x3f51c3f0, 0x3f187747, 0x3dc2e5a8, 0x3f4edeca, 0x3f6ca8e3, 0x3eb04f2b, 0x3ed0b49e, 0x3f5d4973, 0x3eb00bed, 0x3f78f65a, 0x3f4ee8f3, 0x3f375819, 0x3ed4b945, 0x3f46acb8, 0x3da13082, 0x3f16d480, 0x3f306fef, 0x3e5ee84b, 0x3ed52a63, 0x3e643138, 0x3d633c60, 0x3e792d13, 0x3f37b646, 0x3db375ae, 0x3f2cdad3, 0x3e127419, 0x3f36fc26, 0x3f639e49, 0x3f0ec919, 0x3ef4b76f, 0x3e4b2aae, 0x3d19a192, 0x3f7aa7df, 0x3f177931, 0x3ea013ec, 0x3f0c08a7, 0x3f2723ee, 0x3e06fac6, 0x3f541e9b, 0x3dbc387b, 0x3f04db59, 0x3e72ac32, 0x3f61a6f8, 0x3ee7bb95, 0x3f726bb5, 0x3f175a53, 0x3e7dcc21, 0x3f7a23c0, 0x3f65f384, 0x3f1a6c6e, 0x3e924c62, 0x3e8cb8bf, 0x3f2cbb6f, 0x3f52a887, 0x3f32b192, 0x3f34445b, 0x3f3c60dd, 0x3f37f6b2, 0x3eb0e92d, 0x3ebef028, 0x3f7ff141, 0x3e5b152f, 0x3e923e5c, 0x3dd549f9, 0x3f7bc793, 0x3f5e6adb, 0x3dba6889, 0x3f1bab65, 0x3f3535eb, 0x3ef96d6e, 0x3f727d67, 0x3f2c6a5d, 0x3e7367e4, 0x3f562b5a, 0x3e6d1dcd, 0x3ead4196, 0x3f741d7e, 0x3ef8f020, 0x3f108e04, 0x3f0ed18d, 0x3b8c5cc5, 0x3e1136e7, 0x3e1e2c13, 0x3ea3ba77, 0x3f2c6b27, 0x3f4f40a3, 0x3f208f65, 0x3f35f5cf, 0x3f0b0b07, 0x3c8ede1f, 0x3f188302, 0x3e4b7c78, 0x3f75f224, 0x3f476263, 0x3f2377af, 0x3f72278d, 0x3e813059, 0x3f3b3083, 0x3ddbcec8, 0x3e81aa3f, 0x3f33cddd, 0x3f07d30b, 0x3d8dd16c, 0x3e21975f, 0x3c3187cd, 0x3b906b32, 0x3e915ee1, 0x3f28213a, 0x3e93f7f0, 0x3e56a551, 0x3f080e9d, 0x3f10ee39, 0x3f794962, 0x3e8f049b, 0x3e0340d5, 0x3f221501, 0x3e03dbc2, 0x3f4c4d44, 0x3e7e0696, 0x3e07a0b6, 0x3f7300de, 0x3e2dd873, 0x3f5f20c9, 0x3ee07bfe, 0x3f40a750, 0x3e5a465a, 0x3f2cb652, 0x3e376ab6, 0x3f5cea4b, 0x3ed295ea, 0x3eeb53d6, 0x3e808d8f, 0x3e08b2ea, 0x3e871349, 0x3eba66fd, 0x3df9085f, 0x3f70f0fa, 0x3ee5460b, 0x3f42e925, 0x3f4f16d3, 0x3f185910, 0x3c8234f9, 0x3dea7ded, 0x3e088095, 0x3d454fcb, 0x3f71ae60, 0x3e3bdec6, 0x3eacfedf, 0x3f227a20, 0x3f4166e0, 0x3f3e72b9, 0x3e59ef95, 0x3ee12642, 0x3e9b647c, 0x3f3a9e6f, 0x3efa3d92, 0x3e8ff887, 0x3f0434d2, 0x3de53437, 0x3f7d06cd, 0x3e952631, 0x3f094c66, 0x3eb8201d, 0x3f6badf3, 0x3f5ad906, 0x3f5ef6a5, 0x3f5f7c35, 0x3f5189ce, 0x3f6884d7, 0x3f3d4f37, 0x3e99a0cf, 0x3f43a787, 0x3ecddaad, 0x3f1116ca, 0x3eaf5233, 0x3f41c886, 0x3f669f06, 0x3e95e99f, 0x3f7b03b0, 0x3f38d280, 0x3f08fa8b, 0x3f768d97, 0x3f55728a, 0x3e59656f, 0x3f6b5105, 0x3f2908b3, 0x3dad2715, 0x3ee75ab8, 0x3f77bd9d, 0x3f6cf28c, 0x3f6abb88, 0x3dc71b98, 0x3f753826, 0x3ef4903f, 0x3eacb407, 0x3f533ecd, 0x3f49bbcf, 0x3ee2d7b6, 0x3ecab5c4, 0x3cdc0a22, 0x3f1c03ef, 0x3ea1d042, 0x3f21c044, 0x3df14120, 0x3e9b72c5, 0x3e3660e5, 0x3e6be2b5, 0x3ed00453, 0x3e15718f, 0x3f66a583, 0x3f1bfd61, 0x3f2200c1, 0x3e410300, 0x3e1c98e5, 0x3cd61ef1, 0x3e627137, 0x3ed69ad4, 0x3ee9d14e, 0x3e87f067, 0x3ef6b52d, 0x3e650efe, 0x3f14e582, 0x3ed99e30, 0x3ea9df11, 0x3f036a2f, 0x3f3552c1, 0x3dcbc383, 0x3f55e02f, 0x3da583db, 0x3ef5742e, 0x3f4b352b, 0x3f642ecb, 0x3ec59c6b, 0x3e24dec2, 0x3e252503, 0x3ec574b4, 0x3e2b9ecf, 0x3f3c2a45, 0x3ea123a3, 0x3eb55821, 0x3ea6542e, 0x3f7ef848, 0x3e8574b4, 0x3e3d1d47, 0x3f4c18c6, 0x3edca6ec, 0x3ecb0121, 0x3f6093fb, 0x3ea3d07d, 0x3f339fdc, 0x3d823b1b, 0x3e1f444e, 0x3f560210, 0x3e8281dc, 0x3f3aab04, 0x3f6d3e70, 0x3f2b394b, 0x3e4fdac7, 0x3e3d2ed8, 0x3f2b852f, 0x3f6c579f, 0x3de50508, 0x3d275650, 0x3f7a450b, 0x3e8a1f8e, 0x3e4fb3b7, 0x3f0a9047, 0x3e5e3865, 0x3e19aa61, 0x3edef4e0, 0x3d10f099, 0x3e26f47b, 0x3f351750, 0x3d0706ba, 0x3dc5692b, 0x3f4818f8, 0x3da6aa9c, 0x3f5a704c, 0x3ea20d99, 0x3e6f4b1f, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x3e0888f8, 0x3f045dea, 0x3f337b9e, 0x3e9d0a03, 0x3dcb08a7, 0x3bae097e, 0x3f754d94, 0x3f34156e, 0x3ddfe975, 0x3df12989, 0x3e27d780, 0x3e9c460f, 0x3f188030, 0x3f3649d4, 0x3f63c505, 0x3ecf68be, 0x3daf29fc, 0x3f4784cb, 0x3f439ecf, 0x3e6c7de5, 0x3dd1a7e3, 0x3e44febd, 0x3ed0637c, 0x3f2d6883, 0x3f0541a7, 0x3f4fc676, 0x3f7b6988, 0x3ed618ce, 0x3e77e2c5, 0x3e8bd838, 0x3ebb91b4, 0x3f1d8c5d, 0x3f445c9a, 0x3ec71822, 0x3f284f09, 0x3f44f5b2, 0x3de3c18b, 0x3f55336e, 0x3f22f9db, 0x3b3fc324, 0x3eea1d11, 0x3e68e2a0, 0x3e166e01, 0x3e730db7, 0x3ec858bc, 0x3e6bd3c3, 0x3f700618, 0x3e1476f3, 0x3ea85511, 0x3ebd1a22, 0x3f02a64c, 0x3f7bb656, 0x3e8f53e7, 0x3f5844f2, 0x3f673e8a, 0x3eb24639, 0x3e2082cf, 0x3efab496, 0x3f63ab75, 0x3f1daa82, 0x3f2af2fa, 0x3f7f4c5e, 0x3e867297, 0x3ef6c5d2, 0x3f781e04, 0x3cdb0509, 0x3e42bbaa, 0x3f02a6d2, 0x3ec62329, 0x3e348b65, 0x3f1ae7c5, 0x3f1cb274, 0x3ef56c2f, 0x3e17e7c0, 0x3f18cdd9, 0x3ead9ab7, 0x3f28229a, 0x3eb4ff86, 0x3ef5b8fe, 0x3f3e043a, 0x3f120429, 0x3f38e4a8, 0x3f2347fa, 0x3cda3f46, 0x3ea5d67c, 0x3d1cd30a, 0x3f363cda, 0x3ed920e2, 0x3f4a3704, 0x3f198d26, 0x3f1954fc, 0x3eed8a33, 0x3f2191de, 0x3ede9963, 0x3f3fe586, 0x3e82f816, 0x3db1fb5a, 0x3f4e79ff, 0x3f682d17, 0x3f154110, 0x3f3a9eb2, 0x3de2089e, 0x3f4899d0, 0x3f3f7500, 0x3f3c4641, 0x3f322bf1, 0x3e51aeb4, 0x3ddf50e3, 0x3f0d63aa, 0x3f2b17ad, 0x3f544988, 0x3d5994c7, 0x3e7d8a55, 0x3f7eb431, 0x3f4eaf47, 0x3f3850f0, 0x3e6fcdab, 0x3f112578, 0x3ea7d0f2, 0x3f7bb491, 0x3f68d456, 0x3e8d6ef0, 0x3f08e4da, 0x3f2e8651, 0x3f270803, 0x3f593272, 0x3f450b85, 0x3e0e8295, 0x3f48b988, 0x3f775d03, 0x3efc573a, 0x3e357c91, 0x3ed2c1b1, 0x3f1ed18d, 0x3eb08e7a, 0x3f60b967, 0x3e6bc44c, 0x3f3b8540, 0x3f205cdd, 0x3ebd5ed0, 0x3ed2a77a, 0x3b17d5f5, 0x3e27f62b, 0x3f6649e4, 0x3f1a47fe, 0x3f6ad506, 0x3f76b463, 0x3f3ffaf4, 0x3e32bd7f, 0x3f3d2cbf, 0x3e761f9f, 0x3e9ab778, 0x3f3b2da1, 0x3efc0a4a, 0x3ebc5b08, 0x3ef3877b, 0x3f70258d, 0x3f127efa, 0x3f11f30e, 0x3ec92cae, 0x3ee1b6b3, 0x3f63c244, 0x3d9997a9, 0x3f5217c2, 0x3d89fc1d, 0x3e5501e2, 0x3e557cd4, 0x3cb76a9b, 0x3ec6ac21, 0x3dd8c6d6, 0x3eff2607, 0x3e513c68, 0x3f6f5f2d, 0x3f372863, 0x3d3ced77, 0x3f22f6d7, 0x3f679a17, 0x3f5b70df, 0x3e9be426, 0x3dc15e1f, 0x3e8b9496, 0x3f19332b, 0x3f013922, 0x3b26dd24, 0x3cba5d29, 0x3f621cbd, 0x3f51ce7d, 0x3f6b00ac, 0x3d801cf1, 0x3f58f27c, 0x3ead98bf, 0x3e47bdcf, 0x3f1b35c2, 0x3f75537a, 0x3e0e1c15, 0x3e8cf91a, 0x3ebc3c5c, 0x3f4e8ff3, 0x3f260a52, 0x3f58e1e7, 0x3eb7227d, 0x3e2630a9, 0x3f767efa, 0x3ce09fb3, 0x3d001712, 0x3f2e6905, 0x3e444e94, 0x3ec0d024, 0x3d9e89a9, 0x3f494142, 0x3f076577, 0x3e2c9108, 0x3efdf527, 0x3d5852f8, 0x3e6a9da6, 0x3e6dc055, 0x3f254bf1, 0x3d4a17e7, 0x3f184b0a, 0x3e47ba67, 0x3eeea9c5, 0x3dad5b5b, 0x3f2e468d, 0x3ea44029, 0x3e1d0b74, 0x3f60b189, 0x3f618516, 0x3f38c671, 0x3f70d057, 0x3f2fed20, 0x3e06c482, 0x3f167f91, 0x3f3301eb, 0x3e8bbf0e, 0x3f06e7e6, 0x3e9b45f1, 0x3f0b8738, 0x3f6a5cb3, 0x3a945a95, 0x3e8c2b0f, 0x3f2525ab, 0x3f6a6f72, 0x3eb97269, 0x3f78750c, 0x3f5a8cef, 0x3da576f5, 0x3efe594b, 0x3f3f396d, 0x3eb94941, 0x3f702214, 0x3dfd3d43, 0x3ea0a02c, 0x3f278306, 0x3e731338, 0x3f399ef9, 0x3ed8e864, 0x3eb92210, 0x3ddd70a4, 0x3e2bd2b7, 0x3f722c45, 0x3f2fb42d, 0x3f71906d, 0x3f007b89, 0x3f73c340, 0x3f4929fe, 0x3f3a4085, 0x3dcde00d, 0x3d8eab94, 0x3d0c55af, 0x3d682a71, 0x3d8ed253, 0x3e804684, 0x3ecb5137, 0x3ed4e593, 0x3e98b9fe, 0x3ec55b8a, 0x3ebd3c36, 0x3f18b46c, 0x3f26c743, 0x3f031ca8, 0x3db91e4a, 0x3f53292c, 0x3f5b2eae, 0x3f423a9f, 0x3f393d64, 0x3f65c3f0, 0x3efa7c7c, 0x3f0d8dde, 0x3edef156, 0x3b9f4f51, 0x3f2be836, 0x3f2bd5aa, 0x3f1a7aea, 0x3f02860e, 0x3f22ca8a, 0x3f2c489d, 0x3f765e89, 0x3f004be4, 0x3d9ce7e8, 0x3ec20b5f, 0x3e03671b, 0x3f7abc73, 0x3f594fce, 0x3f3effa0, 0x3e3b5a21, 0x3e977597, 0x3f195c21, 0x3d673076, 0x3f6091e2, 0x3e21ff71, 0x3e9eb93d, 0x3e82c0a5, 0x3f1d6ead, 0x3d3423a3, 0x3e582e88, 0x3f1b42ee, 0x3f0a1805, 0x3f1a132b, 0x3eeb126f, 0x3e05a7d2, 0x3babaa12, 0x3eace4c9, 0x3bc2192a, 0x3d0bd358, 0x3bb260fb, 0x3f034a02, 0x3e7b8562, 0x3ded4025, 0x3f2ddfa8, 0x3ef57f0f, 0x3f42bc41, 0x3e80d196, 0x3d3b0956, 0x3ed8ec74, 0x3f4b28b7, 0x3e8e8790, 0x3f6015e4, 0x3ed3b6aa, 0x3e586595, 0x3ed16851, 0x3f3abebe, 0x3ea57236, 0x3f4f9485, 0x3db45382, 0x3f5abf12, 0x3d89f6ec, 0x3f761a3f, 0x3f0f75c9, 0x3de578e6, 0x3f35bd30, 0x3ec00304, 0x3e0b4fa5, 0x3f3eb325, 0x3f2389f8, 0x3f4e99a6, 0x3ebcb3c4, 0x3edffcb9, 0x3ec84a30, 0x3ef9c2e3, 0x3e96f8ad, 0x3f72e5ac, 0x3d24a9b3, 0x3ea65797, 0x3f1ee621, 0x3d8ad3ce, 0x3f217d5b, 0x3f1673b4, 0x3f6c62f6, 0x3ec97df2, 0x3ee6a811, 0x3f1449fd, 0x3cbc58e1, 0x3e809e34, 0x3e8d80c3, 0x3f1547d0, 0x3f628c05, 0x3e09e2bd, 0x3f18d962, 0x3f77ea2d, 0x3f4575c0, 0x3f43295f, 0x3f77826f, 0x3f551b0d, 0x3eed51f8, 0x3f7c4e62, 0x3f6b4c1b, 0x3e92322b, 0x3efd3b4b, 0x3e114163, 0x3edbd6e9, 0x3e8f4b84, 0x3d76bb7e, 0x3e77a398, 0x3df5e636, 0x3f0467ae, 0x3f4650c6, 0x3e18882f, 0x3e9f459e, 0x3f236662, 0x3f413ef7, 0x3f6b71fc, 0x3f5d846f, 0x3dbc699b, 0x3f7eb11c, 0x3ef465c7, 0x3f0fb16c, 0x3e435697, 0x3f6019d2, 0x3f2a48c7, 0x3e83c6a8, 0x3f3cbe83, 0x3ef8348f, 0x3ed5425f, 0x3f3f0953, 0x3f6664b2, 0x3e284f90, 0x3e627f1b, 0x3f5562e1, 0x3ec94f05, 0x3ea2697b, 0x3e8ec1a0, 0x3dee8534, 0x3e9c6b8b, 0x3e712a52, 0x3d959792, 0x3f53382e, 0x3f11c2e3, 0x3f0d42a2, 0x3e37a5b1, 0x3f736998, 0x3f25d474, 0x3f66b39a, 0x3e3508f6, 0x3e824db1, 0x3e40f840, 0x3f225094, 0x3ea4330d, 0x3ea60631, 0x3eaec094, 0x3f29b281, 0x3ebff477, 0x3e1452c6, 0x3e12a38c, 0x3f26ebc4, 0x3cce8569, 0x3daea2e0, 0x3e01ef31, 0x3f609214, 0x3f37d2e9, 0x3ed3a2e0, 0x3e042203, 0x3dd542a2, 0x3f32e137, 0x3d567085, 0x3f149e45, 0x3f57ae14, 0x3f3f9182, 0x3eea8f9f, 0x3f377004, 0x3f592c49, 0x3e57368b, 0x3f13e49b, 0x3da8b9bb, 0x3da8dd47, 0x3f064bba, 0x3f10302b, 0x3f08e68e, 0x3f0b8ed2, 0x3efd6990, 0x3ea88b33, 0x3f14fbec, 0x3f040da2, 0x3f3f27dd, 0x3f783c6d, 0x3ef62c34, 0x3f58f0d8, 0x3f1c75a3, 0x3e9ca31e, 0x3eed1e32, 0x3f6123f6, 0x3f7204b0, 0x3f52989a, 0x3f18051d, 0x3e8e6e01, 0x3ea9fd15, 0x3d0be5e7, 0x3ea5ffc5, 0x3cb333d4, 0x3edfa8d6, 0x3f1e7514, 0x3f45c1c6, 0x3f2c8e04, 0x3ef81755, 0x3dc5df30, 0x3f7bae9b, 0x3e24c09c, 0x3f504546, 0x3f22cc92, 0x3f15c7de, 0x3e786834, 0x3ec0a84c, 0x3f31d441, 0x3f747c20, 0x3f75ccfb, 0x3f170920, 0x3f301377, 0x3e9e208a, 0x3e9ddc40, 0x3ea602eb, 0x3f23f20a, 0x3eee69f0, 0x3f148a59, 0x3f6edb73, 0x3f03e857, 0x3f452ac7, 0x3d5b96e5, 0x3f46e2ca, 0x3f24810a, 0x3e4883fd, 0x3f2bc86d, 0x3ee092cd, 0x3ee4c0df, 0x3e9d09e1, 0x3f6a5b64, 0x3e18dd61, 0x3f2b2980, 0x3ed83f92, 0x3ef0acc1, 0x3e2e8e1d, 0x3f231401, 0x3f6af7d3, 0x3f11332b, 0x3d5a2270, 0x3f454ee4, 0x3e42f5dc, 0x3e522813, 0x3d011905, 0x3f2468ba, 0x3c85ff1e, 0x3f314f7b, 0x3daa6cc9, 0x3d32ceda, 0x3db9993c, 0x3f295326, 0x3db6842e, 0x3eee9ea1, 0x3f66921d, 0x3f3e9b4a, 0x3ea869c6, 0x3f1a4e7b, 0x3f472474, 0x3f496894, 0x3edfa765, 0x3f57af21, 0x3f1c722a, 0x3ef63044, 0x3e44b5dd, 0x3c3e1aee, 0x3f63f76a, 0x3d7c7f78, 0x3ec5d378, 0x3ef04c27, 0x3ce05e44, 0x3f3b9496, 0x3ef8c2e7, 0x3ebfbe55, 0x3f088345, 0x3e9131ec, 0x3f42644e, 0x3e0159c5, 0x3f7e5a8a, 0x3dd334c6, 0x3eab313c, 0x3d287b64, 0x3eca46bf, 0x3e66848c, 0x3f783b82, 0x3eefa893, 0x3e9400da, 0x3f231bac, 0x3e9ee3b4, 0x3f2d6db1, 0x3d3a7c4d, 0x3e8593c4, 0x3ea76b3c, 0x3d9f663a, 0x3da8dcf6, 0x3f673cd5, 0x3ef984e4, 0x3f34e8b8, 0x3eb9d799, 0x3d8b46a0, 0x3f53f92f, 0x3e751a87, 0x3f23032a, 0x3f69c609, 0x3e906940, 0x3e848f54, 0x3d0a236f, 0x3f1af76e, 0x3f7553ce, 0x3f5863bf, 0x3c28f2d3, 0x3e7d8a55, 0x3f62f3f5, 0x3dd5e9e2, 0x3f09742e, 0x3f7c4913, 0x3e3b82c3, 0x3f0bc622, 0x3f270b28, 0x3f40e593, 0x3f579842, 0x3c354f6d, 0x3f369a3d, 0x3ec07486, 0x3f4d9536, 0x3f08fc40, 0x3f4f6c48, 0x3f0b4507, 0x3e9028e5, 0x3e0a1a50, 0x3f779043, 0x3eaa4a6b, 0x3f6fa9b0, 0x3dc7701c, 0x3f56c248, 0x3cbae3cc, 0x3efdc726, 0x3f2b86a1, 0x3d62a836, 0x3c999e37, 0x3eeff738, 0x3ecdd5b2, 0x3f6992fb, 0x3e7583e8, 0x3f101d7e, 0x3f25d50b, 0x3f45cb14, 0x3ec332ad, 0x3f305532, 0x3f23dc16, 0x3d9a6613, 0x3e2e075f, 0x3e94afb4, 0x3efe4884, 0x3eaea4a9, 0x3f385101, 0x3de71b48, 0x3ef4e6c1, 0x3d55d3a7, 0x3f4ae1ac, 0x3f1f7d74, 0x3f56527a, 0x3e8a12b6, 0x3e9e27e1, 0x3f04c8cd, 0x3e28a1e0, 0x3e930015, 0x3ed14962, 0x3d8a2bab, 0x3f01bae4, 0x3da54cf6, 0x3ec3f3bf, 0x3e451b0d, 0x3f5e3d60, 0x3f2e3151, 0x3f729ea1, 0x3f38d291, 0x3f76e17a, 0x3f35ab7e, 0x3f4d8a11, 0x3ea0d1d9, 0x3ec42742, 0x3f175a75, 0x3f18069e, 0x3e77ed85, 0x3f2eb10c, 0x3ef8a3f9, 0x3f1161f6, 0x3eb12275, 0x3f70fa37, 0x3e6ed634, 0x3f25799e, 0x3f3ca516, 0x3f06353f, 0x3f59a1fd, 0x3e659a31, 0x3e64d7f1, 0x3f421ba0, 0x3e36bd2b, 0x3df9ae92, 0x3f302adc, 0x3f646727, 0x3eba4aae, 0x3e5c74b8, 0x3e3651b1, 0x3e9505af, 0x3f42084a, 0x3f143ea7, 0x3ee20210, 0x3f48bf2b, 0x3b1c3adf, 0x3f07955f, 0x3f0f2096, 0x3df37543, 0x3ecfe564, 0x3f1c8484, 0x3f11b185, 0x3c9dc93f, 0x3ed62175, 0x3f47300e, 0x3f62be6a, 0x3f5b94a7, 0x3ec86af4, 0x3d8e6645, 0x3f78a559, 0x3f0ef1ed, 0x3eb531fd, 0x3ee8a06f, 0x3f5b31e4, 0x3f4c8a69, 0x3ea796e1, 0x3ed3994e, 0x3f61d074, 0x3f7a36c1, 0x3f71e892, 0x3e8a12b6, 0x3c19b716, 0x3f43e23f, 0x3f503383, 0x3ef1ef74, 0x3e0aeb3e, 0x3f424b12, 0x3e13bea9, 0x3f46dd16, 0x3db3d161, 0x3f3ad5bf, 0x3ddbd406, 0x3ec213a1, 0x3e8096ff, 0x3f0d6313, 0x3e653155, 0x3e927f80, 0x3f58c5fc, 0x3da3affb, 0x3eab2f88, 0x3ea6defc, 0x3f331c43, 0x3e08b157, 0x3f082f83, 0x3f383a64, 0x3e3d7061, 0x3e289e34, 0x3f460621, 0x3ebb4118, 0x3e798c3b, 0x3f40c437, 0x3f4998f2, 0x3e76fd65, 0x3e775c8e, 0x3f4e696a, 0x3ddf3e8a, 0x3e05c140, 0x3e52e05d, 0x3f511d9b, 0x3d1c8a95, 0x3f63d5cb, 0x3f050acc, 0x3ec1b047, 0x3d083086, 0x3ddc7475, 0x3f5270f4, 0x3f7a1177, 0x3f5d8c8f, 0x3eae20cd, 0x3f768d33, 0x3e455c10, 0x3e895d4f, 0x3f39fbf8, 0x3eb23832, 0x3e1426bb, 0x3ed0038a, 0x3e894856, 0x3e91f278, 0x3f25475a, 0x3f4fa1d3, 0x3f4d99aa, 0x3f186595, 0x3f5337b9, 0x3f22d82c, 0x3f35690a, 0x3e438866, 0x3e82bd7f, 0x3eb65e24, 0x3ed952d2, 0x3ed6d5d0, 0x3f5fc760, 0x3f3637bd, 0x3e8a6373, 0x3ea32e9d, 0x3f4a1f9f, 0x3df91a33, 0x3efb63d4, 0x3f1faaef, 0x3d6821a2, 0x3f0f02e6, 0x3e541feb, 0x3f7586db, 0x3f6aeaea, 0x3e573f75, 0x3eac3526, 0x3e90acc1, 0x3f56f3a1, 0x3f3fd630, 0x3ee28f5c, 0x3f77f317, 0x3f634129, 0x3f4ae947, 0x3f2007ff, 0x3f5d611c, 0x3d0703b0, 0x3f053501, 0x3ea8be94, 0x3b813183, 0x3cf4821d, 0x3f2d9dbb, 0x3f13a701, 0x3f038bac, 0x3f4c6b38, 0x3f234278, 0x3e852e94, 0x3f69846f, 0x3f3c7a29, 0x3e56c1e3, 0x3f6c94b4, 0x3d48ad83, 0x3ea68c8b, 0x3f2858de, 0x3e436588, 0x3f6eb170, 0x3eb8aeda, 0x3e2d01c1, 0x3e5b530d, 0x3f5984d3, 0x3e84e1a4, 0x3e540358, 0x3e5def41, 0x3ef81605, 0x3ecfc9de, 0x3edab64a, 0x3dfcc858, 0x3f60408e, 0x3f6f0dfa, 0x3ea75ff6, 0x3ed1528f, 0x3e6d373b, 0x3f5076d1, 0x3f521145, 0x3f007086, 0x3db3e773, 0x3eff5105, 0x3dd7292c, 0x3dc53785, 0x3eba6245, 0x3cc0907e, 0x3bf8a127, 0x3f09e18f, 0x3f7d0721, 0x3ea5ea25, 0x3ea1d66b, 0x3e351a43, 0x3e31b8aa, 0x3f4cff97, 0x3f60d79d, 0x3ec8bbb2, 0x3f7114c2, 0x3f120ba2, 0x3f7dd13d, 0x3eab6695, 0x3f733d29, 0x3e9148bb, 0x3bd826f3, 0x3ec1d14e, 0x3ec4a622, 0x3f4db952, 0x3f29a1a9, 0x3f3d5a6c, 0x3ea30b18, 0x3f0b6284, 0x3ef74b1f, 0x3f4e3886, 0x3d3abfd5, 0x3d2d981e, 0x3e3133c2, 0x3e1a3ad2, 0x3f7c06e2, 0x3dc225b7, 0x3f4f35a0, 0x3f5d800a, 0x3dce93e2, 0x3f269ef5, 0x3ee39581, 0x3f14ad25, 0x3f54b924, 0x3f190204, 0x3e5fe36d, 0x3f2d5c64, 0x3f2b4adc, 0x3f200b67, 0x3f52ac75, 0x3f09d66b, 0x3eb1b6d4, 0x3e59ea9a, 0x3f0626a2, 0x3f40a0e4, 0x3ed54691, 0x3f332f55, 0x3f5c31ad, 0x3f107a9e, 0x3f27e8cd, 0x3f65b888, 0x3d9cf3cf, 0x3f3efe82, 0x3ef45005, 0x3f2b3b43, 0x3f7f32cf, 0x3ee2e297, 0x3d2bdd33, 0x3ec0489d, 0x3ee1b60b, 0x3eebbde0, 0x3f497215, 0x3cd8dca6, 0x3ccd8955, 0x3f50db27, 0x3d40fbf9, 0x3e86ffa0, 0x3c8b0d7a, 0x3efee9ff, 0x3e5e5d18, 0x3e46afcd, 0x3d9f9fcb, 0x3d8a494a, 0x3eb080b6, 0x3e7fd220, 0x3f11c9c5, 0x3dfd04a3, 0x3e1029f1, 0x3e83f0dc, 0x3f7e221d, 0x3f76fec5, 0x3f2f1df7, 0x3eb2bdc2, 0x3e9b120a, 0x3f30b780, 0x3f0553ce, 0x3e1d06bc, 0x3f404828, 0x3eddd97f, 0x3f315a4b, 0x3ed3f749, 0x3f2b25c4, 0x3f4e9985, 0x3e3aeff6, 0x3c5cccf5, 0x3de37f7c, 0x3d5de574, 0x3f67b613, 0x3f44a59c, 0x3e5da5db, 0x3eddc747, 0x3f7c9518, 0x3f58ea9e, 0x3f46ef0b, 0x3ee7b225, 0x3ec11f0c, 0x3f7a02b8, 0x3f402c2c, 0x3f7f7260, 0x3eeae5de, 0x3ed2aeb0, 0x3e80e0a8, 0x3f4caf3e, 0x3ee87e9e, 0x3ea8eb46, 0x3e12f512, 0x3e2bc83b, 0x3cb8b8e4, 0x3f41986c, 0x3e83b4d5, 0x3d3900ed, 0x3eae3455, 0x3f797929, 0x3f4c4b7f, 0x3f794a5e, 0x3f099978, 0x3e99aac5, 0x3f55a123, 0x3e0ffcdb, 0x3f68eb35, 0x3e306ea0, 0x3d5820be, 0x3f43a11b, 0x3eb23290, 0x3e91edc0, 0x3f36a6f4, 0x3e18b1dd, 0x3a37c98e, 0x3ee898f6, 0x3ea07b14, 0x3eb56b23, 0x3da3cf70, 0x3ee4f1e5, 0x3ee307f2, 0x3e78db49, 0x3dd8efbb, 0x3e11abd2, 0x3eb2fe3f, 0x3f23024f, 0x3f125ecc, 0x3f026aa9, 0x3ef8dc12, 0x3f4530be, 0x3e31904b, 0x3f5230db, 0x3f1684ad, 0x3e99d25b, 0x3f35e5c1, 0x3f0000eb, 0x3e04fca4, 0x3f06049f, 0x3ee1ebea, 0x3f115db3, 0x3f2d5b8a, 0x3f69f395, 0x3ef79e9d, 0x3f2ba7b9, 0x3f45712a, 0x3e983148, 0x3f3c1cb4, 0x3f32a9e7, 0x3f600bbb, 0x3f2a0c9e, 0x3f0c6a5d, 0x3e88791c, 0x3f1f0ccc, 0x3f5cac19, 0x3f7b504c, 0x3f07d5aa, 0x3ece4e8b, 0x3d21059f, 0x3d6fceaa, 0x3e6dd378, 0x3edacabc, 0x3e9ccc68, 0x3d701c5d, 0x3f3f6f7e, 0x3f30da1b, 0x3b0e5a4b, 0x3ea4cc8a, 0x3f4e835e, 0x3ecfd912, 0x3f17bea9, 0x3e1553ac, 0x3edec13c, 0x3f3e0f3d, 0x3f67ec78, 0x3f64a633, 0x3de661ae, 0x3f526602, 0x3f0e8134, 0x3ef5b9c7, 0x3ef2ebe6, 0x3f477293, 0x3ef0c176, 0x3f122a5e, 0x3ef9fe43, 0x3f6fef4a, 0x3f76e58a, 0x397c9e21, 0x3f3a2e7f, 0x3f71af08, 0x3f66f72b, 0x3ef19f80, 0x3f1396af, 0x3e969f6b, 0x3eea1dfc, 0x3f7f8b15, 0x3f10b9dc, 0x3f67a1f5, 0x3dc7a977, 0x3ea2e361, 0x3e169c24, 0x3f02a7bd, 0x3e775c8e, 0x3ea6e08f, 0x3f3f810f, 0x3f51ef20, 0x3f3dfa01, 0x3f6037a4, 0x3f58e9f7, 0x3f674a23, 0x3eeb504c, 0x3ebd610b, 0x3f7f4bd7, 0x3f131f36, 0x3ea77ff1, 0x3f76a151, 0x3e6436b9, 0x3c786e3b, 0x3f7d09d0, 0x3e818740, 0x3f28fb76, 0x3f532831, 0x3f0efe1e, 0x3d3121e1, 0x3e5a083a, 0x3de579f2, 0x3e22a1b6, 0x3f605261, 0x3f6a6890, 0x3f4cac08, 0x3f631f58, 0x3f0c1abd, 0x3f2eb8fa, 0x3db34d5d, 0x3f5794c8, 0x3f558ce3, 0x3f11dd3c, 0x3db9ae1a, 0x3f38d984, 0x3eecae43, 0x3f0774cd, 0x3ef0b6d8, 0x3efd0fa6, 0x3dfb2cc7, 0x3ded4cba, 0x3e8ef0ae, 0x3f373c0c, 0x3f2d8a01, 0x3f7251e3, 0x3eeab94e, 0x3e75aa71, 0x3ed74d9c, 0x3ef77015, 0x3f35df44, 0x3e3ad602, 0x3dc4345d, 0x3f00a6fc, 0x3dada42d, 0x3e8d3309, 0x3f3046a6, 0x3f43cb81, 0x3f280714, 0x3ef371da, 0x3d5d10b2, 0x3ec9871e, 0x3f0e31d7, 0x3f4e9d30, 0x3dad2575, 0x3de48cf8, 0x3ec5e786, 0x3f202acc, 0x3ec01e04, 0x3f012ab7, 0x3ecea50d, 0x3f048c93, 0x3eee47dc, 0x3eeb8e4c, 0x3f78508b, 0x3e8369ba, 0x3dbb6094, 0x3efd840a, 0x3efe19db, 0x3f74b73d, 0x3f48eca7, 0x3eb4ed91, 0x3ef42dae, 0x3edec700, 0x3e38e432, 0x3df92d99, 0x3ecf1c54, 0x3f27c3f8, 0x3e1e3327, 0x3ddf6a0e, 0x3f7b074a, 0x3b8d6833, 0x3edc4418, 0x3f08572a, 0x3f238940, 0x3e0435ad, 0x3f351a97, 0x3ddd095b, 0x3f1013db, 0x3ee473ac, 0x3f0bc72e, 0x3eb9ef0f, 0x3e48b220, 0x3e80d8a9, 0x3e5cd530, 0x3f767c8d, 0x3f64064b, 0x3eca07d5, 0x3edeedab, 0x3f00b381, 0x3ef38477, 0x3e12ec29, 0x3eb01c71, 0x3e64dc23, 0x3f50399b, 0x3ee21b7e, 0x3f651f3f, 0x3f55e9d1, 0x3f4a05bc, 0x3f6ab54e, 0x3e4a7829, 0x3ebac27a, 0x3e8597b3, 0x3f6855eb, 0x3e60f1f5, 0x3eee173c, 0x3e59e237, 0x3e24f616, 0x3df1d68c, 0x3ebe0ed8, 0x3f6a4617, 0x3f4c6749, 0x3e49ff93, 0x3e5d64d8, 0x3f559c6b, 0x3ef5e11a, 0x3d7da9af, 0x3e5e13b2, 0x3ed9098d, 0x3f3c19e3, 0x3f0ea36a, 0x3f5fdc05, 0x3f2ed8d3, 0x3ee52242, 0x3e7fe048, 0x3f04228a, 0x3e613405, 0x3f3c2678, 0x3e9f7f4a, 0x3f3699a6, 0x3e427a20, 0x3f7424d5, 0x3f60da1b, 0x3f1bbb0e, 0x3e929cdc, 0x3e95d54e, 0x3f16263e, 0x3f2723bc, 0x3f05e1c1, 0x3f1b5211, 0x3f0cbdec, 0x3f38bd88, 0x3df18b0d, 0x3f31c6d2, 0x3decd0ff, 0x3e0a450b, 0x3e9f9f45, 0x3ebc8c93, 0x3e3c093e, 0x3f2f8bf0, 0x3f4ee9dd, 0x3f4df4c3, 0x3ebc1f86, 0x3e7e67d7, 0x3f734b51, 0x3f17cd9a, 0x3eedc28f, 0x3d25f4a1, 0x3ee12168, 0x3ed9f106, 0x3e001798, 0x3e448c2e, 0x3f15cd81, 0x3f005e81, 0x3f421390, 0x3f04c250, 0x3ea339e2, 0x3d519d4c, 0x3f0731c2, 0x3f3245e5, 0x3e27dbf5, 0x3f6c61a6, 0x3f63aa15, 0x3f4dc172, 0x3f2831be, 0x3e26149c, 0x3f1289db, 0x3ed4026d, 0x3f2d6239, 0x3f57cbd5, 0x3f04ef13, 0x3e2dc593, 0x3ed0e779, 0x3f5c3fe6, 0x3e6ead0c, 0x3da137a3, 0x3f57c201, 0x3f7bffac, 0x3f48b6e9, 0x3ed3821b, 0x3f6431df, 0x3ea5566d, 0x3f0b8844, 0x3ec923e6, 0x3e67878b, 0x3f784a84, 0x3f0c6195, 0x3e38cda7, 0x3eaf6e61, 0x3ea68a93, 0x3f0bb342, 0x3ee76a51, 0x3ebf6513, 0x3f494120, 0x3e82ecf2, 0x3f5689db, 0x3dc739b0, 0x3f1f52b9, 0x3f6419e3, 0x3f1765fe, 0x3f63ca86, 0x3e9f23ab, 0x3ef2cfb7, 0x3f2166e0, 0x3ead712a, 0x3ecabf34, 0x3f0ec051, 0x3cb764bb, 0x3f020eb6, 0x3f66f0ae, 0x3ec88bdb, 0x3eae56ef, 0x3ed78f69, 0x3f193544, 0x3e8750a0, 0x3f4c3d57, 0x3f74880e, 0x3f7a21b8, 0x3e97f1fa, 0x3bba380a, 0x3d24f949, 0x3f3bc4e3, 0x3e1756c9, 0x3f205e5f, 0x3f2c6ea0, 0x3eaa57a8, 0x3e55703f, 0x3f026bf8, 0x3dfd97f6, 0x3f78d35b, 0x3e78eb89, 0x3f5b1551, 0x3e4fba02, 0x3ecf1498, 0x3f555582, 0x3f238822, 0x3f7634b9, 0x3ec89119, 0x3ed19696, 0x3eeb4070, 0x3f435d9a, 0x3f73e469, 0x3f5eb884, 0x3ea63fff, 0x3c9bed67, 0x3f7a0696, 0x3f6f10fd, 0x3f4c397a, 0x3f729be1, 0x3e314339, 0x3f2de7fb, 0x3c733af6, 0x3f4c1f64, 0x3ed0fcf8, 0x3f51eb53, 0x3e22a3cf, 0x3f01f4a1, 0x3f528cdf, 0x3e86d3fa, 0x3f2daf29, 0x3e152370, 0x3c8317e2, 0x3ed68683, 0x3eaf8078, 0x3f5919ac, 0x3d6ef531, 0x3f4f4b0e, 0x3edd4f16, 0x3f140a07, 0x3f457abc, 0x3dd7268d, 0x3eb03e42, 0x3e4c4114, 0x3f5187a5, 0x3dd1a976, 0x3f170825, 0x3f030ed4, 0x3efd4068, 0x3d2a14a7, 0x3f059e41, 0x3ef53587, 0x3f586163, 0x3f4c029f, 0x3d528c0f, 0x3f0d019f, 0x3db59f7c, 0x3d9764a1, 0x3f1724fb, 0x3f24826b, 0x3e3d87f9, 0x3d08094e, 0x3c97862f, 0x3eb93c04, 0x3ecec700, 0x3d7e3327, 0x3f0bd3e5, 0x3edb8e2a, 0x3f0f29b3, 0x3f13fc01, 0x3e557cd4, 0x3f061177, 0x3e4157ef, 0x3f787d3d, 0x3e89c609, 0x3f346ca9, 0x3e939f12, 0x3f5a9caa, 0x3f144178, 0x3ebcf0fa, 0x3f22eaa7, 0x3e88fcf8, 0x3ed038a0, 0x3e54fdf4, 0x3d319dd2, 0x3f4b23ee, 0x3f6c38b0, 0x3e946328, 0x3ecc1f86, 0x3f201feb, 0x3f11def0, 0x3ed2c9d1, 0x3ebbfc44, 0x3f4bcb2e, 0x3e78bda9, 0x3f06108c, 0x3d29d389, 0x3ec064cb, 0x3d0f3054, 0x3d3fb720, 0x3f05e4f7, 0x3ee4a772, 0x3f312913, 0x3f41fd15, 0x3e285e3e, 0x3f7b4c6e, 0x3e3ab9b2, 0x3e4362a6, 0x3f203600, 0x3f57e7b0, 0x3f602eec, 0x3eba3ec0, 0x3f4b038e, 0x3ee8cf18, 0x3f309efe, 0x3e8677d5, 0x3ec6770c, 0x3e5ebe9d, 0x3c3a14cf, 0x3e88192a, 0x3edacf10, 0x3f0ca4c2, 0x3ea231e8, 0x3eeb5265, 0x3f23720d, 0x3d6bc368, 0x3f054a5e, 0x3f5a6f93, 0x3d97eca1, 0x3f24f11b, 0x3e77292c, 0x3b7ef53e, 0x3e01a3f4, 0x3f1bb331, 0x3f401a7a, 0x3e0bf26f, 0x3efa8028, 0x3f251fd6, 0x3f6e9457, 0x3f18d930, 0x3f0083cb, 0x3f2ddef0, 0x3f3ef683, 0x3f40d307, 0x3bab06a9, 0x3f5f383f, 0x3ece0653, 0x3f399275, 0x3eb0a372, 0x3f18b08e, 0x3f41b552, 0x3dcc6fa2, 0x3f77f5d8, 0x3f1aecaf, 0x3f086b6a, 0x3f2751ce, 0x3df47d80, 0x3e90fb01, 0x3e8239a4, 0x3f4803ac, 0x3e17f3cf, 0x3f6cbb3d, 0x3f24aea7, 0x3ef779a7, 0x3ee3c46e, 0x3f022520, 0x3ec2b474, 0x3f4b3786, 0x3eaf1c97, 0x3ee3e61d, 0x3f024d5e, 0x3d28650e, 0x3d932d03, 0x3ed2ffb0, 0x3e86bd90, 0x3f2bc2a9, 0x3f3cc858, 0x3f471d60, 0x3f0a363b, 0x3eac1355, 0x3f764e9c, 0x3ea528d0, 0x3ea71ae3, 0x3f123316, 0x3f2fa861, 0x39e98a14, 0x3f1346ed, 0x3f12f901, 0x3d9224ee, 0x3e3aeee9, 0x3f738d0d, 0x3daba7b9, 0x3f0090b4, 0x3e369b5a, 0x3f562c45, 0x3f19001d, 0x3f32a811, 0x3edda74c, 0x3f6c7d1c, 0x3e028b6e, 0x3f6186ec, 0x3f789cb2, 0x3e0e6299, 0x3e516617, 0x3f047315, 0x3f0ee654, 0x3ef0f6ad, 0x3f7e834d, 0x3f627536, 0x3efd23b3, 0x3f1b4eec, 0x3dc0c35a, 0x3f5b3322, 0x3f3ed6fe, 0x3f293c36, 0x3e3eabbd, 0x3f4cfa9c, 0x3f0bbeec, 0x3f486445, 0x3e2844d0, 0x3f1108c4, 0x3e6ffc54, 0x3ee77532, 0x3f0e6245, 0x3ecf52b9, 0x3f50476f, 0x3f1ad9be, 0x3f5002e2, 0x3dd78ee3, 0x3efd81ae, 0x3f1fb763, 0x3ecfe261, 0x3f103340, 0x3ed8a99b, 0x3f6ac301, 0x3f211937, 0x3eb59839, 0x3f2344b3, 0x3c5008c1, 0x3eceb7cc, 0x3e8ac12b, 0x3cc41d31, 0x3f3dc769, 0x3a473886, 0x3ce434c8, 0x3f59a198, 0x3f1f72d6, 0x3e9cbea5, 0x3e9dfb0d, 0x3e7dd2af, 0x3f45e918, 0x3e28919f, 0x3f4b25a2, 0x3f0dbc77, 0x3f3cd478, 0x3e43d534, 0x3f636156, 0x3d850b60, 0x3dab2b6a, 0x3ea3c3c6, 0x3ce75a4c, 0x3f54317b, 0x3f1fa29c, 0x3eb38822, 0x3ea8b546, 0x3f403ce2, 0x3f7b3b97, 0x3f3ea66e, 0x3e25c0ba, 0x3c6c7f85, 0x3f0f5b0c, 0x3e89cd3e, 0x3f2b27fe, 0x3e93dc05, 0x3f40e90c, 0x3f5841ab, 0x3f46176e, 0x3e89e908, 0x3d558edd, 0x3f183b71, 0x3f1632f4, 0x3ed343d9, 0x3f3c6584, 0x3f7eb4fa, 0x3f1906bc, 0x3f47e511, 0x3f7b3ede, 0x3f631151, 0x3f000560, 0x3f222542, 0x3f5724d9, 0x3f4c3f1c, 0x3ecd4b27, 0x3f06f449, 0x3e018def, 0x3f59dd90, 0x3d3e5ba0, 0x3e467b1c, 0x3f34ddb5, 0x3e43443d, 0x3f069de9, 0x3f3885d3, 0x3f02f651, 0x3f788755, 0x3ed2c493, 0x3eb0df59, 0x3f6a1640, 0x3f7c5921, 0x3db4c023, 0x3ef1ffd6, 0x3e93b752, 0x3f2624ab, 0x3f75cc21, 0x3eb0a5f0, 0x3e706749, 0x3f2e7e84, 0x3dfad213, 0x3f16602d, 0x3e18be2f, 0x3f44572a, 0x3e51f751, 0x3eff92d1, 0x3f3820c5, 0x3f0597e5, 0x3f549c80, 0x3e4c16df, 0x3f57df2b, 0x3f2d3be2, 0x3f788a26, 0x3f222f06, 0x3f1324fb, 0x3f47a98f, 0x3f193858, 0x3f53c947, 0x3e975c8e, 0x3f20255b, 0x3c240380, 0x3ae11fc0, 0x3e96ca25, 0x3ef2df93, 0x3f3aaac1, 0x3eddda27, 0x3e33c148, 0x3f40079a, 0x3e914c88, 0x3ee221c9, 0x3f0bd977, 0x3ef848bf, 0x3ea5f0d4, 0x3f2fd44a, 0x3e163bef, 0x3f214c12, 0x3e40cbb0, 0x3e3a2ec3, 0x3ef4c22f, 0x3cc86fdb, 0x3ecd2999, 0x3ed5db34, 0x3f2e98bb, 0x3e243aeb, 0x3f76a822, 0x3f7d1bf8, 0x3f5df3e9, 0x3f278067, 0x3edd9b3d, 0x3f3d31a9, 0x3eec29bf, 0x3f0f65cb, 0x3f43bacb, 0x3ed82ea9, 0x3f2ec83f, 0x3f0c47c3, 0x3f21ccd9, 0x3f4a6107, 0x3f0c341a, 0x3f48ccab, 0x3eaa81dc, 0x3f14c283, 0x3f417de1, 0x3f3316b1, 0x3f1410c7, 0x3f5615a9, 0x3f356f97, 0x3f6b86e4, 0x3f18c06a, 0x3ea8fece, 0x3f3fd0d0, 0x3f06e44b, 0x3f2481b2, 0x3e306467, 0x3f016a9c, 0x3e70446b, 0x3f049774, 0x3f6a6751, 0x3e007b35, 0x3ef67360, 0x3e5e75bc, 0x3f674efd, 0x3e8de311, 0x3f1e25fa, 0x3f7fc72e, 0x3f3c9236, 0x3f2741e1, 0x3e0b35f4, 0x3d3dd54e, 0x3f25bcba, 0x3f63a3a9, 0x3daa18a3, 0x3e0ffe2a, 0x3d2fc33c, 0x3d6b7fc6, 0x3f07b4e5, 0x3ee28a1e, 0x3d918c85, 0x3ebb1013, 0x3ea5903a, 0x3e99285b, 0x3e9a5fe9, 0x3f056755, 0x3ecb38b4, 0x3f09f890, 0x3d7489c5, 0x3d2ed8c6, 0x3f479e5a, 0x3f237e5f, 0x3f55a522, 0x3e9868ba, 0x3ee847f5, 0x3e094b38, 0x3f6427c8, 0x3efd655e, 0x3f28521e, 0x3e4d42c4, 0x3ed5da6a, 0x3f32fddb, 0x3f393ea3, 0x3f374eca, 0x3f68a7a4, 0x3ea687f4, 0x3e8930e0, 0x3f6084a5, 0x3f0c1798, 0x3f3c22bc, 0x3f351a00, 0x3e6793de, 0x3e2ebc84, 0x3e80ec10, 0x3ebea423, 0x3eeb66f9, 0x3f7f7a4e, 0x3f1c8d8f, 0x3f0849ed, 0x3f01b3f2, 0x3f5afd65, 0x3e661911, 0x3ecffa7f, 0x3e9bd189, 0x3f2a5d8d, 0x3e8ad85e, 0x3e96b0b8, 0x3f31ebd9, 0x3ed88ce7, 0x3eb3660e, 0x3f68b791, 0x3ead0071, 0x3dec7fbb, 0x3f12b0d9, 0x3c110a34, 0x3f02fff3, 0x3ed13c47, 0x3ee9ed7c, 0x3f6ebb56, 0x3ec8ed3e, 0x3f0ebbfd, 0x3e57342f, 0x3eaa31e8, 0x3f7b3765, 0x3da58403, 0x3f4451fc, 0x3f718c8f, 0x3e4bebe1, 0x3f71af08, 0x3f2bcd36, 0x3ee33b10, 0x3f2bcaa7, 0x3f765300, 0x3dae02d0, 0x3ecb28b7, 0x3f3175e2, 0x3e6e275b, 0x3f644e83, 0x3ec7d7a1, 0x3d4f6e32, 0x3f3e46e1, 0x3f6700de, 0x3f252e73, 0x3e6df7e8, 0x3f09f091, 0x3ead8adb, 0x3e98ee8d, 0x3e168f08, 0x3d824ce1, 0x3f3c473d, 0x3cdcfcc6, 0x3f08af0c, 0x3f025c3e, 0x3db56191, 0x3de71cda, 0x3e2fadf3, 0x3f74f399, 0x3f4c4d34, 0x3ef6a077, 0x3f09806f, 0x3b518294, 0x3f48d8fd, 0x3e1a350d, 0x3f5de29b, 0x3f3f7fd0, 0x3ead95bc, 0x3f4fc89f, 0x3e6a3ec0, 0x3e12c94b, 0x3f5cf92b, 0x3f2d89ce, 0x3c562464, 0x3ed5fbd7, 0x3f543b1d, 0x3ecb22f2, 0x3f77e9fb, 0x3dc24357, 0x3ec3a238, 0x3f09628d, 0x3e46ba8c, 0x3f60cc47, 0x3ea4a793, 0x3f2d8959, 0x3eb33659, 0x3c32c260, 0x3d301f32, 0x3ef73648, 0x3f78d91f, 0x3ec207d5, 0x3f1357d6, 0x3f5c14b6, 0x3eb4200c, 0x3cf7e00b, 0x3f6c36db, 0x3f009625, 0x3eb987e8, 0x3e466cb1, 0x3f238690, 0x3b9e9ea7, 0x3d2be927, 0x3f72e957, 0x3c19c7c7, 0x3d717e27, 0x3e6426bb, 0x3e66e4c1, 0x3f56df93, 0x3f57cdab, 0x3f1b4c7f, 0x3f6311a5, 0x3eebc9cd, 0x3f0e6e44, 0x3f5541d9, 0x3f657050, 0x3e037da6, 0x3f32c5c1, 0x3e4cd78c, 0x3f500e06, 0x3ead7c91, 0x3d2b8dd3, 0x3eaa2be0, 0x3f0d5d81, 0x3f5f3f75, 0x3f4520b0, 0x3eebecee, 0x3ef9a049, 0x3f17368b, 0x3f371ac1, 0x3e234374, 0x3e7b723f, 0x3ee381d8, 0x3e9c08d9, 0x3eaa558f, 0x3e91800a, 0x3e4ea9e7, 0x3dd20c07, 0x3f13531e, 0x3f39d4e9, 0x3f3c1d3b, 0x3e14ea4b, 0x3e54b1ee, 0x3e7de0d6, 0x3ee8fffc, 0x3e1b9c30, 0x3f5d118c, 0x3ec83ff7, 0x3ddc58ac, 0x3ecbba34, 0x3e4ff10f, 0x3f7b9735, 0x3d84c52c, 0x3e92aeb0, 0x3e79628d, 0x3f464d5e, 0x3f0dcc53, 0x3ecbf1c7, 0x3f34c261, 0x3f47f23d, 0x3f1e0ae9, 0x3e9d2157, 0x3f61524c, 0x3f643361, 0x3f2fa10a, 0x3f7e107b, 0x3f2dbccb, 0x3f372703, 0x3f148f65, 0x3f0ea1b6, 0x3db0e835, 0x3f61172f, 0x3f6aab15, 0x3ea435ad, 0x3edf110e, 0x3f6b62b7, 0x3e00b2c8, 0x3d61b973, 0x3f023034, 0x3e6be0df, 0x3e3a582e, 0x3f0a8987, 0x3d985272, 0x3dea88f0, 0x3e9d87d7, 0x3ef749f1, 0x3f4bc8e2, 0x3ebc4546, 0x3f2f9768, 0x3f5a2ced, 0x3e95759f, 0x3b81bd19, 0x3f7b033a, 0x3f2c60fe, 0x3f53fa4c, 0x3e39be4d, 0x3f2892de, 0x3eabb0a3, 0x3eb1fc2b, 0x3e9e0f3d, 0x3f015305, 0x3da89cd7, 0x3f3072d2, 0x3f3bbbd8, 0x3ec4ef46, 0x3f5f49bf, 0x3f407097, 0x3e124207, 0x3f76f33d, 0x3f2f6f6d, 0x3f4ffac2, 0x3ec27568, 0x3f2334c6, 0x3ddd377e, 0x3e50f4d8, 0x3f7c8bca, 0x3f24fde3, 0x3e8abead, 0x3ea794a7, 0x3eec38b0, 0x3ebcd39e, 0x3e87fe6d, 0x3e81f9ad, 0x3d404337, 0x3efab0ea, 0x3bcb7d41, 0x3edd6ead, 0x3eb486f0, 0x3f1ec53b, 0x3cb56283, 0x3dc4ef96, 0x3c8e9c10, 0x3f0ae382, 0x3f492e0e, 0x3f55944b, 0x3e9f85d7, 0x3d820ece, 0x3f32b25b, 0x3ed98266, 0x3f33269e, 0x3dcd8a11, 0x3f360b1c, 0x3ebe7925, 0x3ef353f8, 0x3d53b504, 0x3eb0ed81, 0x3ebc21c0, 0x3ecc67e0, 0x3eb4764b, 0x3f6cf590, 0x3da3e1af, 0x3f1f0186, 0x3e5b1359, 0x3f4bf280, 0x3e77e77d, 0x3d9eba1a, 0x3e39103d, 0x3f4ad00b, 0x3effd780, 0x3f0a0371, 0x3f1b456b, 0x3e8c2268, 0x3e43ff69, 0x3e51743f, 0x3f29a251, 0x3f755d81, 0x3f5eea42, 0x3d0dc6fd, 0x3dddf8f4, 0x3f4de99f, 0x3d7a723c, 0x3f6d4b8c, 0x3ecc825a, 0x3e3855da, 0x3f15ab4b, 0x3f627f80, 0x3f58a1be, 0x3e82a2e4, 0x3f37c5df, 0x3f345e0b, 0x3eb59e62, 0x3ee8d131, 0x3f323d71, 0x3f0ee393, 0x3f0e8bf4, 0x3ee843c4, 0x3f5dab9f, 0x3e3ba2be, 0x3df1a438, 0x3da98b7f, 0x3f15bd1f, 0x3ec7a52b, 0x3f00750c, 0x3f3143bf, 0x3ee8f68c, 0x3f5705d9, 0x3ef7a765, 0x3f773509, 0x3f30b5aa, 0x3ec1d884, 0x3f263b15, 0x3eeb33fd, 0x3f353cbc, 0x3eb20e1f, 0x3e7048e0, 0x3eb5d91b, 0x3f6d51d7, 0x3cdf519f, 0x3f55f938, 0x3f205c03, 0x3f5a39f7, 0x3f57ce31, 0x3f1cee7c, 0x3ebf9d0a, 0x3ed25764, 0x3f523476, 0x3f0b4e87, 0x3e4594af, 0x3e63f9e8, 0x3f25944b, 0x3f617492, 0x3ea752b9, 0x3de3e63f, 0x3f6c32a9, 0x3e6c069e, 0x3f1356a8, 0x3f6b7953, 0x3c7505d1, 0x3f4860bb, 0x3e3fc548, 0x3f17fcca, 0x3f79dcf9, 0x3f31c8fc, 0x3f2b0942, 0x3f309de0, 0x3e992770, 0x3eb25a04, 0x3eb04428, 0x3c830ae2, 0x3f0869d7, 0x3e9d7c91, 0x3e18e475, 0x3e1984a1, 0x3f35cf35, 0x3f39bf9c, 0x3eb8344c, 0x3efd12a9, 0x3f63f1fa, 0x3f5eee20, 0x3f2a5b85, 0x3f35aae7, 0x3f07d7a1, 0x3f2dd7dc, 0x3f22d667, 0x3f7a45e5, 0x3f3e53ca, 0x3f04ab0d, 0x3f41a027, 0x3ef098d4, 0x3f33c4a0, 0x3ef96fca, 0x3e6e52df, 0x3d0a494a, 0x3e013b19, 0x3f3df224, 0x3f0e62cc, 0x3d2041a4, 0x3f65eeaa, 0x3f5a0ded, 0x3f5b497b, 0x3f25d13d, 0x3d828f0c, 0x3e127286, 0x3e563a5c, 0x3f1fc287, 0x3eed52c1, 0x3f1c2539, 0x3f7f81a6, 0x3f53d252, 0x3d43fd86, 0x3e08bbd4, 0x3f433d8e, 0x3d9f00e2, 0x3e10ae53, 0x3f62fc69, 0x3eb1ffb5, 0x3c0a2634, 0x3f7a17c2, 0x3f4bdcdf, 0x3eaf7836, 0x3e2d5ed0, 0x3915bf44, 0x3f668134, 0x3f58a3e8, 0x3f4600b0, 0x3e5bcc6c, 0x3f737ec3, 0x3f2d2fe4, 0x3e23aa7a, 0x3f0a8790, 0x3f593b7e, 0x3cc9ae6a, 0x3f691255, 0x3f253038, 0x3f718e22, 0x3f7b2618, 0x3f0019c1, 0x3e2a4a49, 0x3f393ccd, 0x3e42cf53, 0x3e925658, 0x3f647885, 0x3f738078, 0x3f31054b, 0x3e9dcc85, 0x3dd653ca, 0x3e887f24, 0x3f678972, 0x3d5eafd4, 0x3f70347f, 0x3f7f0d74, 0x3e242203, 0x3f35ab19, 0x3f3ebf87, 0x3f39eefe, 0x3f7e0924, 0x3ea66d37, 0x3f238b9c, 0x3f5a8d11, 0x3e3d7a9a, 0x3f1811b2, 0x3f569d73, 0x3f54318c, 0x3f03e250, 0x3e41e0c6, 0x3ebc9afe, 0x3ea2e686, 0x3d21be61, 0x3e24167b, 0x3f3d2407, 0x3eeb2e38, 0x3f1e68a1, 0x3db86d9a, 0x3e34b87c, 0x3e47f3cf, 0x3d772409, 0x3f2027fa, 0x3f4a379b, 0x3ef4851b, 0x3f094dd7, 0x3f25d063, 0x3f5a40d9, 0x3f599f4d, 0x3f0efe50, 0x3f644d34, 0x3e4a01ac, 0x3e459b80, 0x3e286c22, 0x3ea3a216, 0x3f2691a7, 0x3dcdf15a, 0x3f688e7a, 0x3e9b254e, 0x3e99c821, 0x3e3889c2, 0x3ee76c05, 0x3f5db08a, 0x3f2224bc, 0x3f48a5f0, 0x3e891b82, 0x3f1f60d0, 0x3f01ec3e, 0x3f699a84, 0x3f3b4b51, 0x3f5b0a81, 0x3f58fece, 0x3f1993f7, 0x3cfa6aca, 0x3f13cea7, 0x3f478ed2, 0x3f0339d2, 0x3eb9c971, 0x3f0c41bc, 0x3f1a6aec, 0x3ee38ae3, 0x3f206845, 0x3f5746aa, 0x3ec73d5c, 0x3eb4d573, 0x3d8523c1, 0x3e31b4fe, 0x3f1d91ff, 0x3f6b9e17, 0x3e958644, 0x3ec63f57, 0x3e47ee4e, 0x3f4d80b2, 0x3e9ceca7, 0x3ef2aeb0, 0x3ec64fdb, 0x3de5b8dc, 0x3ef26352, 0x3de1e8a3, 0x3ee3a40e, 0x3f19528f, 0x3f1e83b2, 0x3f657226, 0x3f44f356, 0x3c5d0d8d, 0x3f3e3422, 0x3f48b1ff, 0x3f3e4841, 0x3f111b93, 0x3f47d30b, 0x3f2cd4fe, 0x3e998efc, 0x3f6677c4, 0x3f7dc055, 0x3d5f385a, 0x3f09cb36, 0x3f383537, 0x3f097529, 0x3f2b33ec, 0x3e8f04bc, 0x3ea5538b, 0x3eaadddf, 0x3f165d29, 0x3f763ee2, 0x3d0c5990, 0x3e2c78ea, 0x3f209e77, 0x3e7927d4, 0x3e4bcfd5, 0x3ef3b363, 0x3d83ebf6, 0x3f0db0ab, 0x3f495a7d, 0x3e6fd71b, 0x3f473d19, 0x3ec00a7c, 0x3e83e6e6, 0x3f3372e7, 0x3f32fbd2, 0x3e8c8c2e, 0x3f43e458, 0x3edf223a, 0x3f6a8901, 0x3f08406c, 0x3d1c2799, 0x3f666890, 0x3e351e32, 0x3d97f5c0, 0x3f0845fe, 0x3edcbbc3, 0x3e55c63b, 0x3f0e3c97, 0x3f07b107, 0x3c80d802, 0x3e70f40e, 0x3e14d0dd, 0x3f15d27c, 0x3f7e3455, 0x3f38ee7c, 0x3f3b0e0b, 0x3ed8f4d8, 0x3f594da5, 0x3f56146a, 0x3f2396f2, 0x3eb5857b, 0x3f6bd07d, 0x3d95f641, 0x3ec36c37, 0x3f161d54, 0x3b66edb5, 0x3edbbc6f, 0x3e0687f4, 0x3eb8b264, 0x3e9e2f9d, 0x3f6316d3, 0x3e7c5650, 0x3f5dc21a, 0x3f2dc337, 0x3f59ca2a, 0x3e88dc77, 0x3e29984a, 0x3e2d798e, 0x3f4ea455, 0x3f6678c0, 0x3deb1bbd, 0x3e136e72, 0x3d58cb23, 0x3f1cf206, 0x3f1064dc, 0x3f391b0d, 0x3e9fcd25, 0x3f61baf5, 0x3ec8795f, 0x0, 0x40400000, 0x40800000, 0x40a00000 }; static const uint32_t in_vec1[47] = { 0x3d30be50, 0xbf103a3b, 0x3e1d5a2a, 0x3d538123, 0x3d950cf3, 0xbe523930, 0x3e88f456, 0xbe89acab, 0xbdca0425, 0xbef50bdc, 0x3e8b4398, 0xbe23a366, 0xbc868768, 0xbeafdd88, 0xbe44ce83, 0xbd546741, 0x3eeb91b5, 0x3ec5b591, 0x3ea179f5, 0xbdab4d49, 0xbe8a04b2, 0xbea2d56e, 0xbd5159b6, 0xbda81824, 0xbf059b5e, 0x3c02c4fc, 0x3f800000, 0x3e14ef90, 0x3d9c93a4, 0xbdcaa99e, 0x3dfa6e55, 0x3f0037e4, 0x3e961262, 0xbeaa19f5, 0xbdd9f252, 0xbdc0ffeb, 0x3f1717d4, 0x3e332b37, 0xbdf6f5bf, 0xbd531ff1, 0x3f03e37f, 0xbe77dbc1, 0x3dd462ec, 0xbe059368, 0x3d8cfd9d, 0x3f76e1bc, 0x3e10374f }; static const uint32_t in_cmplx1[4418] = { 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0xbe757ec5, 0xbd8889d2, 0xbe254915, 0xbd8083f0, 0xbe61cce5, 0xbe80fd7b, 0xbd4e5ab6, 0x3ea91014, 0xbcef5f67, 0x3d8bf790, 0x3ce6f5ee, 0x3e76c42f, 0xbc2ae685, 0x3f024b58, 0xbb7b7d03, 0x3ae4384b, 0x3e582f70, 0x3ecf2571, 0x3e19d32e, 0xbd7b1579, 0xbeb46138, 0x3dd62d85, 0xbe43e530, 0xbf0191bf, 0xbb337648, 0x3cfb47db, 0x3e518952, 0xbe492381, 0x3e8d3fd8, 0xbd4d837c, 0xbe1b422c, 0x3f0758f6, 0xbc622877, 0xbefa4b3d, 0x3ecd3960, 0x3dc4be81, 0x3dcdf5db, 0xbd74a9ff, 0x3efa8c8d, 0xbe6393a5, 0xbefe9ed2, 0x3e7376fb, 0x3ea3943c, 0x3e399295, 0x3dcc68c2, 0x3e0a900f, 0xbe28a269, 0x3d0da36d, 0xbe83c471, 0xbe780ec4, 0xbe5048db, 0xbd41adc5, 0xbec16846, 0x3ee87fb9, 0x3c288ea8, 0xbe5a4e46, 0x3ecbe074, 0x3c4265c2, 0x3e2102a8, 0xbd90b1f0, 0xbe8b1acd, 0x3e6d5304, 0x3e2d1e34, 0x3d487da1, 0xbddd9c35, 0xbda219fa, 0xbc9d3f14, 0x3eacff74, 0x3dc18f8c, 0x3e8aef19, 0x3d20d4ff, 0x3f176b21, 0x3eade380, 0x3e9c1d59, 0x3e985fac, 0x3e1874d5, 0x3def0161, 0xbeae7e24, 0xba4ea4b2, 0xbea61595, 0xbf0a500e, 0xbda357b4, 0x3dac8c0d, 0xbe17cdb6, 0x3e45fa75, 0xbe8d4a20, 0xbe2a3cf1, 0xbdd42507, 0x3e200a7a, 0x3d81ba49, 0x3b136e98, 0x3eaf9f44, 0xbe82bda3, 0xbcac4cc9, 0x3e9c1202, 0xbcef1a5e, 0xbc637232, 0x3d7a5272, 0xbd9e2133, 0xbf1d4c93, 0x3ed6ab7f, 0x3ebfdb57, 0x3e3855b1, 0xbed7478e, 0x3e4bcbe4, 0xbe3b2ddb, 0xbe1fa084, 0x3e4f90d2, 0xbe2e7652, 0x3d382fab, 0xbe256446, 0x3dfb9402, 0x3eaf5ddd, 0xbe49ba0f, 0xbe210004, 0xbd4778d9, 0x3e47cd06, 0x3da2d4a2, 0xbe922f60, 0xbed26a28, 0x3cb60292, 0xbd6e8cb0, 0xbbc91835, 0xbad5d6d5, 0xbd792a0f, 0xbebeeb8b, 0xbefba082, 0xbe195172, 0xbdd0c34d, 0xbe55f5ad, 0x3e119ad4, 0xbec009a8, 0x3d9bd766, 0x3e46f156, 0xbddec721, 0xbe9a0a88, 0xbd22d17f, 0xbde6b3f7, 0xbe0d30ab, 0xbe26ae09, 0x3d825a6b, 0xbe2d6627, 0x3e50fbd3, 0xbe6a138f, 0xbeba552c, 0x3e4da39e, 0xbe9d3d2b, 0xbd13f9fd, 0x3eb1f597, 0xbcaf830a, 0x3ee0b8c9, 0xbe1a4ab7, 0x3d3defc1, 0x3e919d1d, 0x3eef1da3, 0x3e99828a, 0xbf02508c, 0x3ef54f35, 0x3dcafd5f, 0x3d795822, 0xbec11a5a, 0xbc9c8f08, 0x3ebb0671, 0xbd93ae46, 0x3ed12233, 0x3cf0a0f6, 0x3e10cb7f, 0x3dc42580, 0x3eb53e23, 0x3d9f71ae, 0xbcc78909, 0x3e0e1c8b, 0xbe40da31, 0xbe42115a, 0xbf04cbeb, 0x3ead3cc5, 0x3dbbc1c1, 0xbea0f54a, 0x3ec515f2, 0x3e14c5de, 0x3e9f2cee, 0xbd8a1828, 0x3d943954, 0xbbdba675, 0xbe779f8d, 0xbea21726, 0x3f119a84, 0x3e7d0f87, 0x3e589d61, 0x3ec30337, 0x3f183777, 0xbe62a2ee, 0x3d373a68, 0x3e4a3f82, 0xbe3e38e9, 0xbe25daac, 0xbe018139, 0x3d4120c8, 0x3cab4eb0, 0x3e98829b, 0xbe95f76e, 0xbf55c793, 0x3e76a376, 0x3edb77d9, 0x3e62280b, 0x3e9771a0, 0xbe403f85, 0xbebbbbe9, 0xbe62b356, 0x3ea4ce76, 0xbebbb0d3, 0x3dd89f9a, 0xbdd6619b, 0xbde90339, 0xbd9ed648, 0xbf26e410, 0xbe3339e1, 0x3ded0801, 0xbe393909, 0x3d910ec3, 0x3dbac47c, 0xbf19b0e8, 0xbe40185c, 0xbe00930c, 0xbe44b1a6, 0x3e3c8aae, 0xbe1a1e6a, 0x3e424120, 0x3dd6fc27, 0xbe8d547b, 0xbc193aa0, 0x3cda7a52, 0x3e498fea, 0x3e042748, 0xbd7f466a, 0x3c897a90, 0xbea28f28, 0xbe207103, 0x3e9bc233, 0xbe7f1a42, 0xbe3e1fc7, 0xbda39228, 0x3eb5c85b, 0x3ee7f78c, 0x3e388ceb, 0x3e79aedc, 0xbe52592c, 0xbdc08d50, 0x3e3b03d2, 0xbf09141a, 0x3eb73ec7, 0xbe559ad2, 0x3c1d502e, 0xbcec4252, 0xbe0d680a, 0x3e9b1807, 0x3e7e9e1a, 0x3f09a824, 0x3e68cbe6, 0x3e55e50a, 0x3f09f8e9, 0xbea92006, 0xbe90192d, 0xbea07cc8, 0xbeced03f, 0x3e25f713, 0x3d1eca98, 0xbf214b52, 0x3d2f2523, 0x3cd22c9a, 0x3ca30c17, 0xbe33083e, 0xbf048b1c, 0xbd4ed9c5, 0x3de00a18, 0xbdc345eb, 0xbd55e189, 0xbea3fe7c, 0xbd277406, 0xbba7d7aa, 0xbe7bf4cb, 0xbdf6cfad, 0x3e03d91e, 0x3dfdd50d, 0x3eba9f11, 0xbccb4f19, 0x3d63d6b8, 0xbc5a36d0, 0x3d2c999c, 0x3d4a4b28, 0xbf03b507, 0xbe856300, 0xbc855ad9, 0xbd7bf046, 0xbe3342b9, 0xbde5866b, 0x3e9005dc, 0xbef48863, 0x3de1e8e7, 0xbe19a239, 0xbeae1030, 0x3da9364c, 0xbedcdab9, 0x3cc8d763, 0x3de5fd47, 0x3dedbe8d, 0x3e8c3353, 0xbd068c6a, 0x3d4efe2b, 0x3d398e73, 0xbe20ccae, 0xbdfa48ed, 0xbe7b534b, 0x3d401b64, 0x3d9f291b, 0x3d9d2b2f, 0x3b9d1250, 0x3bd4f76d, 0xbeb4223a, 0x3e85a434, 0x3e0ebe45, 0xbe1985c4, 0x3f151dfd, 0xbf0c71ec, 0xbeda8b4a, 0x3c92cc20, 0x3f28d416, 0x3e8d3488, 0xbd0426e4, 0xbba483ac, 0xbf0ecdeb, 0x3deb978a, 0xbe513c3e, 0xbe56b872, 0x3cb0d556, 0x3e560d23, 0xbe761675, 0x3dfc11ba, 0xbee63a66, 0x3e85d247, 0xbdcc677c, 0xbcf48b94, 0xbd58e5ca, 0x3c9b0b03, 0x3e8878ce, 0x3db2c399, 0xbe01451b, 0x3c14a874, 0xbda21f11, 0xbe02a081, 0xbdd3f146, 0x3bb4948e, 0x3e40607c, 0xbe9aaa7d, 0x3ec3c781, 0xbd89a4fc, 0x3d2526de, 0x3ee4479b, 0xbe9cbe70, 0x3e21973e, 0xbe0cbbd9, 0x3e9c072e, 0xbd38a9c8, 0x3cfaf543, 0xbe1231c0, 0xbdede402, 0x3d43a51e, 0xbe1b4e14, 0x3dcb8d92, 0x3dde23d3, 0xbe7d0197, 0xbde483e3, 0xbd8b2f34, 0xbe39bb9c, 0x3e101121, 0x3df705bc, 0xbc934c3b, 0x3cfb5e73, 0xbe5eaf8b, 0xbe1fbcf8, 0xbe91eb1d, 0xbe3c61d7, 0x3e20f550, 0xbd08e0c5, 0x3c789598, 0xbe1d0c12, 0xbe7b7177, 0x3d32b0dc, 0x3e90b84a, 0xbee04aa7, 0xbdaef524, 0xba780fdf, 0xbe643fce, 0x3d9be96d, 0xbdfccdfd, 0x3db2482a, 0xbe19189c, 0xbd2bb9bc, 0xbe893ee3, 0x3e7c34e2, 0x3e643b12, 0x3e2a7380, 0x3c12a753, 0x3d8a71ca, 0xbea57f59, 0x3de1d498, 0x3dc5202d, 0x3db6c7c5, 0xbd6c26a7, 0x3d8deebc, 0x3dd8c6df, 0xbec94f6c, 0x3e82384d, 0xbe5066b5, 0xbe5597cc, 0xbe8146b5, 0xbc0f3db7, 0x3d2b893f, 0xbe30f874, 0xbe6f45e1, 0xbd60ae03, 0x3ded78da, 0xbded79c1, 0x3db30d74, 0xbee6db1f, 0xbc047a02, 0x3dcab8a2, 0xbeb76510, 0x3e651716, 0xbdf7b533, 0xbeee3d27, 0x3e85436b, 0x3e3a5dd9, 0xbe139f40, 0x3e86a442, 0x3e1af4de, 0xbdd3c5cf, 0xbe905f1d, 0xbd18ffe4, 0xbe662517, 0x3ee45119, 0x3ee83d97, 0x3e812836, 0x3cfb571a, 0xbdbc6b90, 0x3d6a9674, 0xbd0829aa, 0xbe5e84be, 0xbdd3a0ba, 0x3e3ded3e, 0xbdd07e43, 0x3daf95d5, 0xbe91eaf2, 0xbb9edc36, 0xbe0ec0a2, 0x3c8d3b3a, 0x3e37c214, 0xbe07320e, 0xbdb203e6, 0x3ce28194, 0x3ca66a00, 0xbdcca5f2, 0xbd3aa334, 0xbe10106f, 0x3e9b6d75, 0xbd00dc8c, 0xbd855421, 0xbdd9a59d, 0x3d9a47f3, 0xbe6acf17, 0xbeb0a6b6, 0x3d2ab7d9, 0xbe7126f0, 0x3d2aae30, 0xbda54042, 0x3e0a2185, 0x3e9bf8da, 0xbe986381, 0xbe11d07f, 0xbe29b025, 0x3d92b4e1, 0x3db104d1, 0xbbf6d91b, 0x3dd945d9, 0xbe5b1f46, 0x3cb31d1f, 0x3e94f5d8, 0x3dd23a49, 0x3d28c5a3, 0xbe1040f8, 0xbd029112, 0xbe8a3229, 0xbed52f2c, 0x3e3c3a14, 0xbe3cda14, 0x3e096176, 0xbe9e234a, 0x3e83e4b0, 0x3d609497, 0x3cb5f26e, 0xbe630291, 0x3ea005ec, 0x3e685b4c, 0xbed19a1f, 0xbe1383fa, 0x3e00f1e2, 0x3c30e0c4, 0x3de33901, 0xbda89866, 0xbdf0a3a5, 0x3e8fc877, 0xbe85450a, 0x3e3d0399, 0x3e011bf6, 0x3e9506d8, 0xbd6f600c, 0xbed60cd4, 0xbe5942e5, 0xbe150bb8, 0xbcfbeaa0, 0x3d9400e4, 0x3e595e0e, 0xbe448d80, 0x3e0f85aa, 0xbdaa8381, 0xbd46f720, 0xbe12b405, 0x3cbc7065, 0xbe97c2fb, 0xbbf81e0b, 0x3e5a4699, 0xbd07729f, 0xbd5bccbe, 0xbdb659c8, 0x3e8e06ac, 0x3d2136d6, 0xbc67b3eb, 0xbdb58a15, 0xbd850286, 0xbd9dfb83, 0xbe80fc76, 0xbc2921df, 0x3e23a489, 0x3f0d758e, 0xbe08c269, 0x3e36874d, 0x3eb1f4fb, 0x3bbe1ab0, 0x3d1adfdd, 0x3da2e8ee, 0xbd91650b, 0xbdd5efbf, 0x3e34e619, 0xbe33f835, 0x3dc36a21, 0x3ebb1db9, 0xbec0b5de, 0xbd0f4be5, 0x3e85eb8c, 0xbdb5066c, 0xbe8c423f, 0x3dc3bdb2, 0xbeadc244, 0x3e9fef7e, 0x3ed7c2af, 0x3e940e6d, 0xbf0c0528, 0x3e518a9f, 0xbe503069, 0xbd6f94fe, 0x3efcba3b, 0xbdb7446d, 0x3e608c22, 0x3e591a4d, 0x3d8470ca, 0x3bf74960, 0xbf1d7120, 0xbda4af3b, 0xbb86d1c6, 0x3ea9e731, 0x3e6df45c, 0x3ee36126, 0xbea7a002, 0x3e48e724, 0xbe3e770d, 0xbe152fe3, 0xbdc6dfa4, 0xbd7930e1, 0xbe68bdb3, 0xbe502dde, 0xbf091df7, 0xbd945d71, 0x3e099b39, 0xbd3ea206, 0xbe19fc75, 0x3f1a8314, 0xbcfa80a9, 0xbe899f1a, 0x3e16bdff, 0xbee291db, 0x3ddde7be, 0xbe35a060, 0xbf1a8bf0, 0x3c8abc9a, 0xbe06add9, 0x3e0d2d06, 0x3d2b81bd, 0xbd55eaf2, 0x3e8f64d2, 0x3e88c6e8, 0xbd49ba34, 0x3d9ed9db, 0xbf100e67, 0xbe48d933, 0xbe322f44, 0xbec26617, 0x3e1c55a0, 0x3e8dc862, 0x3e908725, 0xbd12fb95, 0x3db7d085, 0xbd03fb7c, 0x3e088847, 0x3d675998, 0x3ee51aa8, 0xbd588649, 0x3e8041cd, 0x3dba2a77, 0xbe1e73c6, 0x3f016c5d, 0xbe2cd30f, 0x3e4b54db, 0x3dcdc3bd, 0x3d2bd8c3, 0x3ddd46be, 0x3ea578ed, 0x3e72a7e7, 0x3cb2190b, 0x3d64b4eb, 0x3dbd6b23, 0xbd8e1da5, 0xbe511cf1, 0xbec58e8d, 0x3ea03693, 0xbefb36d5, 0x3dd9a5a3, 0x3d01c8d1, 0xbeaf4a39, 0xbca7c6a7, 0x3d1a3837, 0xbe04ed9b, 0x3ea878e8, 0x3ddff0d9, 0x3d874745, 0x3e9e61d2, 0x3dad7a13, 0xbd37c051, 0x3cf75515, 0xbf0e0dae, 0x3eeac3df, 0x3e29c7a7, 0xbe5b3f0a, 0xbe5e181a, 0xbe942f1c, 0xbeece379, 0x3e8f4e6c, 0x3d9f5a42, 0xbdaf6a2f, 0xbf145b6d, 0xbd5cc9e8, 0x3e82a6cc, 0xbdd79741, 0xbea12a40, 0x3eb6d8ad, 0x3cfcf4fc, 0xbd0a9d21, 0x3d0b18a6, 0xbd28551c, 0x3e5c8219, 0xbf10fd28, 0xbe746e34, 0x3be14a89, 0xbe47a037, 0x3e78d357, 0x3d95d942, 0xbe14d1da, 0xbda71182, 0xbc10a35f, 0x3ddde56e, 0xbd68b71c, 0xbe2764df, 0xbe029ee1, 0x3ca1f91b, 0xbeca1a6f, 0x3d44727e, 0xbe1559e2, 0xbd40c1ff, 0x3f0f0537, 0x3dbab408, 0x3e874075, 0xbddb12e2, 0xbea73bd5, 0xbe7cc110, 0x3e49b99b, 0x3ee8a6ef, 0xbecdfc83, 0xbe655cf7, 0xbe283296, 0xbcb9e884, 0x3d33d695, 0x3e8e9c0b, 0x3ed04bc5, 0xbd4a6913, 0xbe9da285, 0xbeb0e3cd, 0xbe960490, 0x3e80172c, 0xbda47883, 0xbe35454c, 0x3e3b9df0, 0xbefdfada, 0x3c970318, 0x3e012acf, 0xbc97e10e, 0xbbe39251, 0x3a1754ba, 0x3f352957, 0x3da75fc5, 0xbe3ee4e1, 0x3e50b2cb, 0xbe14d4bb, 0x3e995f0b, 0xbb6d54ce, 0x3e6fdbda, 0xbe4c9453, 0xbe891f59, 0xbe50a96d, 0xbe98f279, 0x3d766833, 0xbc94ea13, 0x3e4637dd, 0x3e758992, 0xbcc55cc7, 0xbe39b85f, 0x3f193b33, 0xbe38717d, 0x3ef1406c, 0xbe387fe5, 0xbe535741, 0x3df8c954, 0xbe0725fe, 0xbed11981, 0x3ddbd91f, 0xbd216680, 0xbe4880e8, 0xbe60b5c0, 0xbe98682a, 0x3d8a6775, 0x3dd7f539, 0x3cbd52d0, 0xbd8598c5, 0x3e8a6ca1, 0xbcc217b9, 0xbdcc018a, 0xbe1fc41f, 0x3e2734f2, 0x3e02c963, 0x3ecd14ff, 0x3f1ee577, 0x3d8d3f67, 0x3d873003, 0xbe83550b, 0x3dae337c, 0x3e0bc7ab, 0x3f27d139, 0x3e063a24, 0x3ddee1eb, 0x3ef704eb, 0xbe731724, 0xbde2db29, 0x3eca4a1d, 0x3ee89673, 0x3e0358e0, 0x3e217655, 0x3e5c3b61, 0xbdde0889, 0x3d9d5fd6, 0xbe5cb599, 0x3c456641, 0x3e701e70, 0xbeb97c60, 0xbd51dc12, 0xbe68ebca, 0xbd51edcb, 0x3d98f1ac, 0x3d9bb216, 0x3ec8eb55, 0xbe2799d1, 0x3eb26d90, 0xbea6ee90, 0x3dc4e3de, 0x3d984b00, 0x3decc07c, 0x3e350eb3, 0x3e0c395d, 0xbdf8a2ef, 0xbb34d460, 0xbdaaeadc, 0x3ed09dd0, 0xbe50a933, 0xbe153588, 0x3f0a91b8, 0x3d8ab9d7, 0xbee643d3, 0xbe16b0ca, 0xbec64c5b, 0x3e7f3775, 0xbe552704, 0x3dbbf58a, 0x3d8223ba, 0xbeb2ae72, 0x3e631c58, 0x3dd24d07, 0xbd52a275, 0x3e677c2f, 0xbcd3f1ea, 0x3c9ff8ce, 0x3cba79fc, 0x3df544dc, 0x3bf55fb8, 0x3e9af431, 0xbe9e34b8, 0xbf1ee45c, 0x3df8dcbf, 0xbdacb410, 0x3db9e2cb, 0xbb845ac3, 0xbe54b03a, 0xbec597b2, 0xbe517302, 0xbceb7c09, 0x3e584b55, 0x3c36478b, 0x3e71ec95, 0xbe205e33, 0xbed6ca54, 0xbe133b0d, 0xbcf58092, 0x3c78c680, 0xbea93985, 0xbc4da1f7, 0xbd0b0c4b, 0x3d8a367f, 0x3e5d9eb0, 0x3e599197, 0xbe203089, 0xbd90b2d0, 0xbd09cef5, 0x3ea2275b, 0xbe5d2674, 0x3d7cd754, 0x3d9f4b9f, 0xbe9009ac, 0xbea596ee, 0x3d8d313b, 0xbe9a4ed8, 0xbe77613d, 0xbe145dec, 0xbd7f10d1, 0x3e55d563, 0xbe07eb5f, 0x3e6d2f85, 0x3e48e378, 0xbd627a05, 0xbdb31466, 0xbc0fd51e, 0xbdbe4dd8, 0x3e44b74f, 0xbe0a7d89, 0xbc59e7e7, 0x3e3b3a9a, 0xbc5a9aed, 0x3de60286, 0x3e432731, 0x3c9e5309, 0x3c084a5a, 0x3d2d7a7b, 0x3e7a2a22, 0xbe8195c0, 0x3eb6528a, 0xbbf7dab0, 0xbe82b3e8, 0x3e4ea457, 0xbed648b7, 0x3ea6e8d1, 0x3e24caec, 0xbe38d597, 0xbe001906, 0x3eadaefb, 0xbdeda078, 0xbe8fddd6, 0xbf0195e4, 0x3c6d3bc2, 0x3e3a85b7, 0xbe63591e, 0xbdf37022, 0xbd921fc7, 0xbc8ed783, 0x3bd69748, 0x3e8fbf24, 0xbd3950a3, 0x3e267af8, 0xbdcca5c5, 0xbd60fd84, 0xbcafd50a, 0x3ed9b34f, 0x3d115b3c, 0xbebb1281, 0x3e2858ad, 0x3d2614a2, 0x3d2fe493, 0xbe8a3eb2, 0x3d36a16a, 0xbeb3dd20, 0x3e300823, 0xbdf63495, 0xbbc96dbf, 0x3ec00813, 0x3f1eab1c, 0x3d9e71d5, 0xbe537798, 0xbd13c5db, 0x3ef54c6b, 0xbe4fd0f0, 0xbe22e01b, 0x3e465f04, 0x3eaaefe6, 0x3cacbfba, 0x3e882356, 0x3c3cd1eb, 0xbc40a63d, 0xbe6e8999, 0xbe1ddee8, 0xbd4631ed, 0xbdd47e26, 0x3df5c11f, 0xbded3eea, 0x3ccc44a9, 0xbe4c1e0c, 0x3dc020ba, 0x3e42e557, 0xbdba88db, 0xbea9239a, 0x3e95c654, 0x3d1fd75a, 0x3ea80b1e, 0x3ea38bb8, 0xbd5ffc49, 0xbeb5c791, 0x3d2b440c, 0xbe894211, 0xbc75c2f5, 0xbe01648b, 0xbd185afb, 0xbe0115c3, 0x3e68b23b, 0x3e26f321, 0x3e91d2f1, 0xbe73006d, 0x3e28ff59, 0x3e22f246, 0xbe9ddec9, 0x3a386ed6, 0x3e23f416, 0x3e208cc3, 0xbde66ea4, 0xbe84f669, 0x3e0068f4, 0x3e912f00, 0xbdc5a82a, 0xbe834614, 0xbd83dde0, 0xbb82d6bb, 0x3e142839, 0xbe1915fe, 0x3d0e90e7, 0xbdcfbe73, 0xbea158a5, 0x3e29a4ca, 0x3e043fba, 0xbee0f750, 0x3d447d37, 0xbe8fc976, 0xbe9a9a65, 0x3d3bd52f, 0x3c401ad0, 0xbe3c3b9f, 0x3e83c67c, 0x3e86d10a, 0x3e194c4c, 0xbd136b81, 0xbcdc5ab5, 0x3df02358, 0x3dea2a7a, 0xbda20a4b, 0x3e97143c, 0xbebe3e08, 0xbe60197b, 0xbe8fc8c8, 0xbd8ab800, 0x3efa6e62, 0x3e8fe83b, 0x3e32f2d4, 0xbec64caf, 0xbf1e8e9f, 0xbde1410d, 0x3e030c9b, 0x3d242cd8, 0xbe5ac6d2, 0xbe1b6182, 0x3e1c8f16, 0xbebc9bfa, 0x3e871d8a, 0xbcb82add, 0x3ea86b51, 0xbe9fb82e, 0x3e393f50, 0x3c2d1e7f, 0xbe8a80bc, 0xbc06154e, 0xbd22461c, 0x3ee20007, 0x3cf0ad6d, 0xbf0929c9, 0xbd371bd0, 0x3eb87aec, 0x3cee69e2, 0x3ea8156d, 0xbea90d57, 0xbdcbf8e4, 0x3db377dd, 0xbd93ff15, 0x3ce5714e, 0x3cca379e, 0xbe3507a1, 0x3efbbb03, 0xbc7a6834, 0xbdd9eba3, 0x3d9d1ac0, 0xbe7c93ae, 0xbe39e2b6, 0xbe14323d, 0x3e5e2d7f, 0xbd9c3501, 0xbc1efed0, 0xbe516911, 0xbe04a209, 0xbefb3d8b, 0xbd3b915a, 0xbd8e8248, 0xbe7ff8b1, 0xbddfa034, 0x3d88a0c3, 0x3cda2f47, 0x3e09dcfe, 0x3eb2cf5c, 0xbe165cbd, 0xbe094776, 0x3e1d1a6c, 0x3c82512b, 0x3dd7e845, 0x3ec23a94, 0xbe6f7941, 0x3e0b4ac3, 0xbdb5aa29, 0x3e7dd7ac, 0x3f17764a, 0xbe31f5c0, 0x3ca5c351, 0x3e807b49, 0xbeb6fcaf, 0x3e35e188, 0x3e92421c, 0xbce3820b, 0x3dc7edb1, 0xbf800000, 0x3ea46c53, 0x3e5f42b6, 0xbb256b14, 0xbe843052, 0xbd1dfb24, 0x3e9c97aa, 0xbe668385, 0x3de136b8, 0x3e201fff, 0x3f07c220, 0x3e8688ff, 0xbe6aa8c4, 0x3eec1588, 0x3dd094cf, 0x3e8d64b5, 0x3ea8e6b2, 0xbe580e11, 0x3e3f5f3d, 0xbdb4ad1a, 0x3e84400f, 0x3d2517e7, 0x3e41d95b, 0xbe174e7e, 0x3e19b741, 0x3dff44cc, 0xbe3dcff1, 0xbd90738b, 0xbdb80e64, 0x3e09b1a7, 0xbeaf5f2d, 0x3ec042af, 0x3e9f6cfd, 0xbe98b81d, 0x3ca65ca4, 0x3ed0480a, 0xbd85bca3, 0xbe80968f, 0xbe2f7ff1, 0x3c891183, 0x3d449395, 0x3d21b627, 0xbdd0ff5d, 0x3d9d3d38, 0xbeabafd0, 0x3e4c7adf, 0xbe35e254, 0xbe350f87, 0x3d4ba3b9, 0x3e9a3b12, 0xbe8cc3c7, 0xbe0a13a3, 0x3ee149aa, 0x3e89820c, 0xbed9aa69, 0xbe133e45, 0x3f117fe5, 0xbcbbde37, 0xbe972578, 0x3e2476ba, 0x3f0d174b, 0xbd115100, 0xbe869b9e, 0x3e3d5c51, 0x3ddd25c4, 0x3e913e6a, 0x3e11263d, 0xbe33f832, 0xbe9080ed, 0xbe9336f5, 0xbe911db8, 0xbe18b45c, 0x3e3d3ddd, 0xbc55b7f7, 0x3e062f78, 0x3e870f01, 0xbcd40469, 0xbd93c937, 0x3ddd6ab9, 0xbe805656, 0x3e8ab376, 0x3db33cba, 0xbe0d3386, 0x3df01ef3, 0x3d73a8e8, 0x3d505556, 0x3e3f90f6, 0xbeafbca8, 0x3e2b14e3, 0x3d66c2cf, 0xbe9c321f, 0xbde0cf66, 0x3e25f577, 0x3e330d9a, 0x3d7f9bbc, 0x3dd32851, 0x3e4abc85, 0xbbc535ae, 0xbea4e693, 0x3ed503ed, 0x3e2c61b2, 0x3d624d21, 0x3ebbb45a, 0x3d361ab5, 0xbdff1e41, 0x3eabbcb7, 0xbe4bacb1, 0xbeab06af, 0xbc14d9df, 0x3e3c9485, 0xbd178575, 0x3e9512a4, 0xbda0717f, 0xbd70f80d, 0xbc142d5f, 0x3e921437, 0x3f18c774, 0x3e9d4eec, 0x3cabd67e, 0xbe0acf5f, 0xbe44a628, 0xbe3983b4, 0x3d201991, 0x3e96ba78, 0x3c0f5060, 0xbe582057, 0x3c419ee6, 0x3d6dc73f, 0xbeabf2e1, 0x3e3bddbb, 0xbd02716f, 0x3ea832e6, 0x3e8da14e, 0x3dc8a187, 0xbe4f61e0, 0xbda2541c, 0xbd590ce5, 0x3daf36e5, 0xbda581a9, 0xbe0d775d, 0xbea988de, 0xbe8c3223, 0xbd995334, 0x3c875830, 0xbedac7bd, 0x3e4cb0b7, 0xbdaebff8, 0x3e07a02d, 0xbdb3557f, 0x3e108009, 0x3dd5a3f2, 0xbe5c1c7e, 0x3d85af51, 0x3e88d36b, 0x3e17d6df, 0x3e066e9d, 0x3ded8b8e, 0xbe22b925, 0x3e3bf513, 0x3e46d3fd, 0xbe793f7f, 0x3e9fedf5, 0xbef328d7, 0x3ee93529, 0xbeb0f50a, 0x3dae9abb, 0x3d85dc2f, 0x3e4a2248, 0xbe9f85ef, 0x3dc4ffcb, 0xbd5761ad, 0x3e02aa32, 0x3ea7b205, 0x3e0eae94, 0x3ea0f308, 0xbe525367, 0x3eb016c4, 0x3e180181, 0xbe991c96, 0x3db12312, 0xbd34b2be, 0x3e751e7b, 0x3cb166e7, 0x3dce9016, 0x3e78f8ea, 0xbf0083a4, 0xbd8081c4, 0x3e2a190a, 0x3e2303a0, 0xbe4da51b, 0x3e90d431, 0x3e5df6d9, 0xbe96af69, 0x3e30f859, 0xbcb48e7d, 0x3dfda29c, 0xbdb75589, 0x3dafb764, 0xbeccb507, 0x3e7a698f, 0x3dd13c15, 0xbd844732, 0xbef8980b, 0xbd62ca5a, 0x3d209427, 0xbdc6129c, 0xbe4617c4, 0xbdc2f8d3, 0x3e618b0e, 0xbe9d8345, 0xbedd104e, 0xbeb4e7e8, 0x3d38e6a0, 0x3ee4bf37, 0xbe18b1dc, 0xbe818fbf, 0xbcb84246, 0xbd98e5bd, 0x3e955966, 0x3ea1029e, 0x3d276133, 0x3e60d7e6, 0xbe246e49, 0x3e899ec6, 0x3db8839f, 0x3dab3e84, 0xbe90e110, 0x3ed844c1, 0xbe5c39eb, 0x3e39a9f4, 0x3e8b9bf9, 0xbdff83a2, 0xbd810abd, 0xbe7b8ad2, 0xbe16829c, 0x3e8dfbfa, 0xbe4c3ee5, 0xbc01767a, 0x3e9cad67, 0x3df2bf62, 0x3deb43d2, 0xbe82a992, 0xbf0e7ea5, 0xbd2b0fc5, 0x3ef42e98, 0xbe0c7fd9, 0xbed41fc2, 0x3e8027c7, 0x3dd6dba3, 0xbd7cfea0, 0xbd114a08, 0x3d694133, 0xbd822db6, 0x3d8c57e5, 0xbe9daa22, 0x3ead220f, 0x3e006269, 0x3e3323d2, 0xbe212d34, 0x3c842aab, 0xbde0a6bd, 0xbddb662d, 0x3d80a632, 0xbd654700, 0xbf0a481b, 0x3e0dd1ec, 0xbe836cb0, 0x3eaec378, 0xbb6a3726, 0x3e209eb1, 0x3e96f4fd, 0xbdbb344f, 0x3e7f6bbe, 0xbe3b8b1b, 0xbf0b108a, 0xbd6605e8, 0x3de01d31, 0x3d0ba1f8, 0xbe8bf2d2, 0xbe8fa77e, 0x3e85c182, 0x3d9474ee, 0xbe11f174, 0x3d0e7d03, 0xbf0c2cf4, 0xbe4291c1, 0xbd2c474b, 0xbd021833, 0xbd8779de, 0xbed54219, 0xbee06470, 0xbe66df78, 0x3f01fcd9, 0x3dcc647a, 0xbe4d0262, 0xbd48b1ba, 0xbdf40d45, 0xbe8cba76, 0xbd8fbff7, 0xbe0e5b63, 0x3e77b1f5, 0xbd851d62, 0x3d4c3d80, 0x3c2b61c3, 0xbea1c1bf, 0x3dd62398, 0xbc031dd9, 0xbda7667c, 0x3e86232a, 0xbda7b496, 0xbf0d7132, 0xbd611d4d, 0xbd32402e, 0xbe315536, 0xbe21c98b, 0xbe58d0cc, 0xbe328fcf, 0x3e38d91e, 0xbc499e77, 0xbe68b049, 0xbdb79b89, 0x3e827dec, 0x3ef7113c, 0x3e118240, 0x3c42c384, 0xbd8d14c6, 0xbe976b1f, 0xbf13dbd1, 0x3ec94a51, 0x3d4dc461, 0x3bb4c290, 0x3eac7726, 0x3e8f5fb9, 0x3f18f77f, 0xbed7af89, 0x3c8a0358, 0xbda575a4, 0x3e028dbc, 0xbeca0dd6, 0x3d27e339, 0x3ec13057, 0x3d8feac6, 0xbe9f9dd3, 0xbea07de8, 0x3e3579f2, 0x3c9f49f1, 0x3de514b2, 0x3e05cdf2, 0xbe3deb8d, 0x3e1f7c09, 0xbe0435d5, 0x3d39e878, 0xbea6871c, 0x3dbfeeae, 0x3e9a84c7, 0xbeaee422, 0xbe3b64a4, 0x3e33023e, 0x3c40eaba, 0xbe010ba4, 0x3e064237, 0x3e8319b6, 0xbf041357, 0x3f013523, 0x3e5d7e36, 0xbe66e448, 0xbe44c12d, 0x3b86cb56, 0xbed19c32, 0xbc8dda6d, 0x3eb7ff61, 0x3db3cead, 0xbde4f473, 0xbe68669b, 0xbdcca9d2, 0x3e822e37, 0x3d834f4c, 0xbd94c49e, 0x3e6a1ca2, 0xbe9bf3d4, 0xbe2dd1c2, 0xbdf36b3b, 0xbe404404, 0xbe01fac6, 0x3e1857f3, 0xbe1a96f5, 0x3ef349c3, 0xbd09bc4e, 0x3d45cfb3, 0xbea7c80f, 0x3cd7cce0, 0x3e855d45, 0x3ea59b3d, 0x3d9260f6, 0x3eb1fc42, 0x3ca3ddc9, 0x3f2dc551, 0xbea20440, 0x3e87cbc0, 0x3dc766e0, 0xbe8a76a8, 0xbf2af518, 0xbdbb884c, 0x3e2346ec, 0xbd707acf, 0xbe795f3d, 0x3e88d94e, 0xbd4e8d67, 0xbf196ea3, 0xbd60a792, 0xbda99150, 0x3eb2f15a, 0x3cad9de7, 0xbe913d37, 0x3e698e2b, 0x3de4d84f, 0xbdcc77d9, 0xbecc8dd4, 0xba72791f, 0xbe0569bb, 0x3d191649, 0xbd1bb297, 0xbe837452, 0xbe013d39, 0xbd7baed9, 0xbcf52b4f, 0x3e42a1fd, 0x3d6878c7, 0x3d83800c, 0xba9425fa, 0xbe85ff98, 0x3dd64d81, 0xbcc87ea6, 0x3e4234f6, 0x3e900b70, 0x3dbf8c79, 0x3e86470f, 0xbd2c8f25, 0x3e4b6d29, 0x3d6ed379, 0xbe2f08e1, 0x3b0c0e78, 0x3e788124, 0x3e8c8d8f, 0x3cf20c95, 0x3e69d945, 0xbed1b571, 0x3efd79fd, 0xbcebc839, 0x3e3a279b, 0xbd7dbb33, 0x3d610030, 0xbf00db77, 0xbdfa4320, 0xbea35fad, 0x3e758cc8, 0x3e1c550f, 0xbdb4105b, 0xbc3bf705, 0x3e7ff4b2, 0x3da73571, 0xbe30aa5a, 0xbf0ffd48, 0xbde97150, 0x3d492d7d, 0x3d9c6577, 0x3f265468, 0x3d55200a, 0xbd62a177, 0x3e787793, 0x3ec5a75e, 0x3d5c5f30, 0x3ebe0c1e, 0x3e4d1f41, 0xbd05e285, 0xbcb05dcd, 0x3c2843e0, 0xbedd3e94, 0x3df23772, 0xbe25f3a4, 0x3ee165e1, 0x3e2934b0, 0x3dc258f5, 0x3e111ef0, 0xbe433942, 0xbeee4c04, 0xbf1becbc, 0xbe64273a, 0xbe4e0eab, 0x3ddd17fb, 0xbe823062, 0xbdcd3846, 0x3e129ab4, 0xbd02fd06, 0x3e4656c7, 0xbed864f5, 0xbf030455, 0x3ec0efe7, 0xbd71b702, 0xbea59b00, 0xbea1f322, 0xbd692826, 0xbe07fbb7, 0x3da12506, 0x3db80286, 0xbccaa6e7, 0x3d9c828f, 0x3d24103e, 0x3c988c7e, 0x3e45ad19, 0x3e9e0190, 0x3e270656, 0x3f1219dd, 0xbc863a01, 0xbe2c92b3, 0xbdc1482c, 0x3d821e9b, 0xbd9e8e5e, 0xbe2ab585, 0xbe66e2b0, 0x3e566fa8, 0x3ce184c3, 0x3e6c93ed, 0x3e7a3cb6, 0xbe786d99, 0xbd195d5e, 0xbc9b132a, 0xbe153110, 0x3f0c185a, 0xbe6df5ff, 0xbcb20179, 0x3e4af236, 0xbe5a9eeb, 0x3edead62, 0xbde69ecd, 0x3e9ce9da, 0x3e927d0e, 0x3eb3c3f7, 0xbea0c4bc, 0xbd239e39, 0x3e88fd89, 0xbdb8c1cb, 0x3eabc233, 0x3dc30e7c, 0x3da25ac8, 0x3d2c1479, 0xbe2826c8, 0xbdbd0a99, 0x3b5be593, 0x3d266885, 0x3cce03dd, 0xbcbe006b, 0x3e0fc4c6, 0xbddf0d15, 0xbdc7d4ed, 0xbe6a796c, 0xbe09d638, 0x3d6cfd69, 0x3eefc009, 0x3f1740ee, 0xbe776352, 0xbe89abd9, 0xbec29ca2, 0x3ca248a7, 0x3e775985, 0x3e678f4f, 0xbf2107b2, 0xbd342eb6, 0x3def7285, 0xbd64ce14, 0xbd14592c, 0x3d93592f, 0xbe67f3f3, 0x3e590dc5, 0x3f3fd8c0, 0x3e7798fa, 0xbeaeffc3, 0x3e2ec655, 0xbb92a220, 0x3d7f5d9f, 0x3ec4698d, 0x3e7fa1aa, 0x3be08129, 0x3e0030e3, 0x3e9b398e, 0xbdb5f0a6, 0x3ea68158, 0xbd2c47f8, 0x3d890936, 0x3e132172, 0xbe48fad3, 0xbd0fc4df, 0xbdbd1d59, 0xbf40d17c, 0xbe419936, 0xbe7e3868, 0x3e925f9b, 0x3e5e6b52, 0xbe696e3a, 0xbe106503, 0x3e372539, 0xbe80ae6e, 0xbe1a9008, 0xbe121ff0, 0x3d1cfe72, 0xbe17f814, 0x3e5720e7, 0xbe8c0c6d, 0xbe279d09, 0xbe53e659, 0x3e1a1090, 0x3e5da638, 0x3bb9f7ac, 0xbe14f056, 0xbe976bf3, 0x3ccd1e82, 0x3e1cba60, 0x3e3098cd, 0x3e0cccc9, 0xbeb9a6ff, 0xbc971468, 0xbe8a1834, 0x3e34e16d, 0xbe699a1c, 0xbea3cc6f, 0x3e1ba8c9, 0xbd2011d1, 0xbed004da, 0x3eaae804, 0x3dfea3a5, 0x3dbab4b3, 0x3ebf22b1, 0xbe1fae86, 0xbd067fb1, 0x3e6b76fc, 0x3f025397, 0x3e21d82f, 0xbd46fc03, 0xbded87c2, 0x3e3fe34a, 0xbeb05dd6, 0xbe712399, 0xbe072ded, 0x3eb0a6e5, 0x3e280960, 0x3e014c67, 0x3e817939, 0xbedef163, 0x3e9cd1f7, 0x3e33e6aa, 0x3e4665de, 0xbdd59004, 0x3cb12fc5, 0x3ed5bce4, 0x3df3a542, 0xbd749627, 0x3e503042, 0x3e8ae84f, 0x3cf4d626, 0xbdecc9f6, 0x3e3d82a5, 0x3e117560, 0x3f1471e3, 0xbdf23fcb, 0x3df8b848, 0xbcef91e8, 0x3e06530d, 0x3e8ee4b1, 0x3daec57b, 0xbee6d9da, 0x3eb5d137, 0xbd3cfdec, 0x3cec89b5, 0x3d2eca74, 0xbe01552e, 0x3e6ae944, 0xbe42e598, 0xbd9092cc, 0xbe41fb4b, 0xbd5b3668, 0xbdef4264, 0xbe196250, 0xbec12542, 0x3e7cfb49, 0xbe96c2f8, 0x3e5c4989, 0xbe45e694, 0x3ce2037f, 0xbf039344, 0xbcb00e00, 0xbeabf4eb, 0xbeb7661b, 0xbeaef53f, 0x3e27a67c, 0xbd7e13eb, 0x3e38dd03, 0xbedbf7ce, 0xbdbdd3fd, 0xbdfb5218, 0xbea9506b, 0x3ef6dd71, 0xbeaf3567, 0xbdb0f99c, 0x3dd2b791, 0xbeabb7c8, 0xbeab8201, 0x3e87138d, 0xbe983499, 0x3d54c957, 0xbedc0a57, 0x3efa8703, 0xbd4d6ce2, 0xbdb0c148, 0x3e244503, 0x3ec94154, 0xbe0dedcc, 0xbe1c92fb, 0x3e20563a, 0xbef7a953, 0x3e76e2fc, 0xbb7a0ae9, 0xbf052d0b, 0x3e2b7a78, 0x3d7529c4, 0x3de37820, 0xbccab23e, 0x3e647a98, 0x3e7e0b23, 0xbd5113fa, 0xbd3ef228, 0xbe974758, 0x3e388cbb, 0xbdf3ae73, 0x3eb7644d, 0x3d93d48e, 0xbe040816, 0xbdd5eb1b, 0xbe0e1d45, 0x3e04e70d, 0xbe35f51c, 0x3ddb6950, 0x3e627e6e, 0xbe4e994c, 0x3e81e101, 0x3c1283f2, 0xbeb3f344, 0x3b126942, 0x3eb4d9d6, 0xbe9059ff, 0x3e1dd799, 0xbd76fbe8, 0x3db79164, 0x3e743cc3, 0x3e67fdb4, 0xbe80f4b9, 0x3d625e41, 0x3d81e7f9, 0xbe9d2a7a, 0xbc01b6f6, 0xbc39bed1, 0x3e755d88, 0x3e5202e2, 0x3e3ff0b9, 0xbc343fc8, 0xbe222b2f, 0xbe7f0088, 0xbedf37ac, 0x3e8d0693, 0x3df2fb64, 0xbcbba5aa, 0x3e84ec38, 0xbdfa4dad, 0x3c778bb7, 0xbee33a39, 0xbe32ae18, 0x3ec358b9, 0xbe73d3af, 0x3edcfd56, 0xbc3c04a2, 0x3dbbe763, 0x3e796449, 0x3eb49a28, 0xbd38216c, 0xbb700753, 0xbe0ed16a, 0xbde8fc2d, 0xbcaf78d8, 0xbefeb23a, 0x3d4349f4, 0xbd884ac6, 0xbe12b9d6, 0x3da1f940, 0xbf14d3c7, 0xbe338fed, 0x3bf9127a, 0xbd5fe4c1, 0xbc6902c3, 0x3e2ebf33, 0x3e04a44a, 0x3d8ac945, 0x3b47adb1, 0x3e8f5cbb, 0xbe05fe97, 0x3dd5e868, 0xbe00100f, 0xbd981a91, 0x3d6af422, 0x3e38ac8e, 0x3d9cb145, 0xbca492fe, 0xbe5691f8, 0xbd00033e, 0xbefbc84f, 0x3cc6bad3, 0xbd40663d, 0x3ea80cdb, 0x3e1f8a3c, 0xbe38646c, 0x3d50a82b, 0x3c8c676c, 0x3db80edf, 0x3e91b319, 0x3f1f9092, 0xbdf64925, 0xbed488e2, 0xbe13926e, 0x3baca0a6, 0xbe8af628, 0x3e92c870, 0x3ea6131a, 0x3debe654, 0xbd9ea790, 0xbeb5e12d, 0xbe3e0101, 0x3d865206, 0x3c715c65, 0xbed5d471, 0x3e56be6d, 0xbe7378ed, 0xbcdb2bef, 0x3e6c72e7, 0x3f1a0dd9, 0x3e0f5532, 0x3e7f196e, 0xbe3f5f9f, 0x3e4ccf87, 0xbd2b5837, 0x3eaea610, 0xbeb6c156, 0xbedb263a, 0x3ea09c74, 0xbd5fcf36, 0x3e406880, 0x3e3ae38b, 0x3ec6d1ca, 0xbe283bdf, 0xbe334bac, 0x3de3d1ba, 0x3e0d4920, 0x3e8617a3, 0x3e4513e9, 0x3e7f472e, 0xbc8a6851, 0xbd28293c, 0xbe8df3e1, 0xbd80f22e, 0x3ddb808f, 0xbcde508d, 0xbe066e23, 0x3e489aaf, 0x3ec59ad7, 0x3e96e97b, 0xbd614871, 0xbedc3d38, 0xbcd9d232, 0x3e21e593, 0xbd7dc66c, 0xbd655104, 0x3e6cd8e8, 0xbdd011c9, 0x3e39cd84, 0xbe366bca, 0xbe525dd9, 0x3f2fcf80, 0x3dd2329f, 0xbe4882e6, 0x3e7dcd07, 0xbe145b7f, 0xbc83b989, 0x3bedd43a, 0x3e48609b, 0xbf0606ce, 0x3c9e46f0, 0x3d8b97cc, 0x3ce3ba1b, 0xbddf6061, 0x3e03d413, 0x3d6544bc, 0xbe8e7520, 0xbe063675, 0xbac65527, 0x3e2a352d, 0xbc7235d9, 0x3dc379dd, 0xbe2de9ab, 0xbd72fd58, 0x3e9bdcb7, 0x3eac4acc, 0xbec7323f, 0x3d6ed231, 0xbe2476f3, 0xbe43d3d4, 0xbe883385, 0xbad1628f, 0x3d95a4b3, 0x3e088e53, 0x3dd2502f, 0xbd9db215, 0xbf056e44, 0x3ec44e1d, 0x3e8cbeeb, 0xbe935384, 0xbdb479da, 0xbc1393c5, 0x3e67bd4d, 0x3e1c089f, 0x3e8296fb, 0xbd057d86, 0x3e94456d, 0x3d8f57b9, 0xbc7456eb, 0xbd64677a, 0x3e5b804a, 0xbd2b28fc, 0x3e563c2e, 0xbe894a42, 0x3e51a3db, 0xbe070c48, 0xbe28154b, 0xba88b9b1, 0xbdbcec36, 0x3eaded7c, 0xbdd4d9cb, 0x3e13fd0e, 0xbe10c154, 0xbdfd5b40, 0x3cc837c0, 0x3e9da67b, 0xbe7585c7, 0xbe443fef, 0x3e920bb9, 0x3e238177, 0xbe826384, 0x3e3b574c, 0x3e968a5c, 0xbde55d85, 0x3eacae4d, 0x3c83b57b, 0x3df4df3a, 0x3d409021, 0xbef50232, 0x3e65ae43, 0x3efeb18e, 0x3ebedff3, 0x3dc851da, 0xbdc3203a, 0xbd9d1f3b, 0x3e657500, 0xbeac3e3d, 0x3d851af1, 0x3d54ac82, 0x3e97e38b, 0xbdec3cd5, 0x3e8309f1, 0x3e6ab1b8, 0x3eb2cfb8, 0x3d0752ab, 0xbe216659, 0x3ec1ba50, 0x3ea075ca, 0xbe3a92a7, 0x3dfa9f5d, 0x3d7fe4b9, 0xbe446b10, 0x3ec00b0f, 0x3e218ab9, 0x3e38e2a1, 0xbeee47e2, 0xbdfe3b97, 0xbe0889d7, 0x3e67f716, 0xbe8f822e, 0x3da8ba95, 0x3eb14f1c, 0x3e63cb8a, 0xbe0b30ab, 0xbe8f2e6c, 0xbe44249b, 0x3ea83073, 0xbe6a0f43, 0x3e068396, 0x3d00de55, 0x3e0a52cb, 0x3eaf570e, 0xbe45b75c, 0xbdff295a, 0xbe80b2fb, 0x3d05b223, 0x3ea979c9, 0x3ed1c444, 0x3e3dfab5, 0x3d2f8f10, 0xbe021d3f, 0xbee9560d, 0x3da88f0e, 0xbd8dbb24, 0x3e662270, 0x3e9a2b8a, 0xbea07a30, 0xbe9b82b1, 0x3d639059, 0xbe727ade, 0xbe402242, 0x3e4e616e, 0xbee4f99d, 0xbe730ba6, 0x3e04eb7a, 0x3e93f525, 0xb99363ef, 0x3ecd0cc3, 0xbe0cc30c, 0x3de90ffd, 0xbcb064f3, 0x3d64b1e4, 0xbdf0eb0d, 0x3d9e0432, 0xbef1199c, 0x3d4032ac, 0xbe38afe6, 0x3d9d3815, 0xbd53a6da, 0xbe325fbc, 0x3e317cd9, 0xbeb25162, 0x3d031d34, 0x3dbeeb0a, 0xbd23b98c, 0xbea91794, 0xbe0c130d, 0x3f07beb0, 0x3ec4bc84, 0xbd03a2f9, 0xbe2eae56, 0x3ea02f0f, 0x391d51e3, 0x3ee55808, 0x3e819508, 0x3e24473d, 0xbe0dc3a3, 0x3de20b09, 0x3d256578, 0x3f39954c, 0xbec676bd, 0x3edd638a, 0xbe8401ee, 0x3de4191b, 0x3e9b1c21, 0xbec7de77, 0xbe8d9614, 0xbd69ad13, 0xbe3eb67b, 0xbf341db1, 0x3e6d59a5, 0x3d460676, 0x3dcdde5b, 0xbe924f6a, 0x3e30d6fa, 0x3e226dd5, 0x3e821f03, 0x3ee9f17a, 0xbe82ff1e, 0xbcb6bc28, 0x3eac2919, 0x3e948b5e, 0xbe4f955c, 0xbdf09ed7, 0xb92c1c16, 0x3e2ef919, 0xbd8d0286, 0xbe9394d0, 0xbda56dc0, 0x3ea13f61, 0x3e98ecf1, 0xbe556ebe, 0x3e89f16d, 0xbea5148f, 0xbcc2752d, 0x3e0deb71, 0xbea22504, 0xbd3fd16c, 0xbd618a2c, 0x3dd4807b, 0x3e19b109, 0xbe6225fd, 0xbd8ae45f, 0x3ddce779, 0x3ed4fc78, 0x3e56a533, 0x3ec5cb6a, 0x3d0d0a42, 0x3e0e86f8, 0xbd3cb1e4, 0xbef9e1c3, 0x3cab4d03, 0x3e134544, 0xbd646984, 0x3f0dea09, 0x3ee47cdc, 0xbd43561a, 0xbe542e8e, 0xbe8217b5, 0xbea291b0, 0x3d15a10a, 0x3db9fd06, 0x3e730132, 0xbea8f480, 0xbec504a6, 0x3e7c5bff, 0x3d2591f3, 0x3e2600de, 0x3dc1465c, 0x3f126b1d, 0x3e26b1ea, 0x3f04b03d, 0x3e9fe6a8, 0x3e09dafe, 0xbcacaf66, 0x3e8ad734, 0x3f10a810, 0x3e0f0b65, 0x3e4e4d7b, 0x3dc8860d, 0x3e2a742d, 0x3e41bc9d, 0xbd6e59c0, 0x3e44c5f5, 0xbebd3cdc, 0xbee2e115, 0xbeb0e193, 0x3e034cfa, 0xbd52ac5a, 0x3c92bd1c, 0x3ef3158a, 0x3c4d4900, 0x3bae2a1f, 0x3d3360b6, 0xbdf4d050, 0x3efc589e, 0x3e662fb5, 0xbe959f44, 0x3f29847b, 0xbe909c00, 0xbe66495e, 0xbec47687, 0xbebffff9, 0xbe7ec90f, 0x3da69530, 0x3d8adfa1, 0xbef9fd2b, 0xbec942b3, 0xbdfaa5b4, 0xbe18137c, 0xbe1d5112, 0xbe3cac44, 0x3cbe4265, 0x3e198144, 0x3e3598f7, 0xbebfe28e, 0xbdd390ae, 0x3e47d4a8, 0x3ec0326e, 0x3dd99a7a, 0xbeaa7eca, 0x3e90b1fa, 0x3ef35423, 0x3e734bb2, 0x3e460359, 0xbe9020b9, 0x3e46ab8b, 0x3e4c8ef5, 0x3ee3ff08, 0x3d1ed194, 0xbeeaf198, 0x3dfae786, 0x3ea10652, 0x3da20518, 0x3e07a20d, 0xbf310a75, 0x3eb1c882, 0x3edbb45c, 0x3df0b6db, 0x3ec77959, 0x3e0aee09, 0xbee84d80, 0x3d98984f, 0xbc989602, 0xbdb04562, 0xbf00b6a8, 0xbd37f95f, 0xbe5fc39c, 0xbdcf5893, 0x3e6e7196, 0x3e6b6585, 0x3e0278f3, 0xbd52d6b1, 0x3cf10456, 0x3c80b34b, 0x3e962376, 0xbea4ab40, 0xbebef851, 0xbe9e7fa2, 0x3caf8884, 0xbe2b21af, 0xbe56a1c2, 0xbd7953eb, 0xbcbb7f89, 0x3e8a920d, 0x3ec81232, 0x3eacfc99, 0x3c9bb80f, 0xbdad7c8d, 0xbe1628a6, 0xbce6e691, 0x3d9873d5, 0xbce6152b, 0xbd945a6f, 0x3f212123, 0xbe001c39, 0xbd6d54c3, 0xbe76e63b, 0xbe129e9a, 0xbe5c420e, 0xbd137022, 0xbd3b65ba, 0x3dce73ea, 0x3f0fa074, 0xbdb1783a, 0xbd88c4be, 0xbdfafe3d, 0xbec1f66f, 0xbeaac832, 0xbcd51ed1, 0xbefd78be, 0x3cfa65cf, 0xbcf95c1f, 0xbc5a6859, 0x3da72db0, 0xbe492560, 0xbdc575cc, 0x3e9a0b18, 0xbe0de206, 0xbe2f75de, 0x3e8b14e5, 0xbd8bb28c, 0xbe3d6250, 0x3dd5b46a, 0xbe83ba29, 0x3f0b3ece, 0x3e5e8d86, 0xbe1eb108, 0xbebd7b03, 0x3eedf90c, 0xbe917ce0, 0x3d43392f, 0xbcb5570f, 0x3e08feb2, 0x3e7da598, 0x3e22cc8f, 0xbeac0f2f, 0x3ca422ee, 0xbea6fa53, 0xbed8ba68, 0xbbad87a5, 0xbe48802d, 0xbe89ec08, 0x3e72f362, 0xbd86f4e8, 0xbe9c200c, 0xbddd9d80, 0x3e56c4f6, 0xbe863f9a, 0xbe52a532, 0x3e030451, 0xbe836fc5, 0x3cedbc14, 0x3ebea65d, 0xbe6465c6, 0xbee0a617, 0x3e223e6b, 0x3db60cc5, 0x3d223736, 0x3ea72c50, 0xbeb5af54, 0x3d4b31bb, 0x3f07e050, 0xbf33fb81, 0xbde44c1b, 0x3d35d468, 0xbe331fa2, 0xbe3d9bc9, 0x3e608d9a, 0x3e2bb43d, 0xbc03ea21, 0x3e61f033, 0x3ebd6dd5, 0x3da95362, 0x3e580ce1, 0x3ddc50ef, 0xbe10301f, 0x3deb87a4, 0x3dcc1d19, 0x3cace239, 0x3e915bf1, 0xbe1f4653, 0x3f2ce2a7, 0x3f04a079, 0x3e7733a9, 0xbe21b82c, 0xbec50989, 0xbe22402d, 0xbdcdae67, 0xbe3de8db, 0xbecfbb4b, 0x3dc12112, 0x3dc20fdd, 0x3e61f77d, 0x3e2a9974, 0x3dace133, 0xbe8213b1, 0x3e91713d, 0xbd60d44c, 0x3df00b87, 0x3e9d019f, 0xbeae075c, 0x3eb4e504, 0x3d98ffa6, 0xbe1f6af5, 0x3e4d2247, 0x3e062495, 0xbe745a19, 0x3dbf9e5d, 0xbe1fc7fb, 0x3e81b68b, 0x3e2c3608, 0x3d02057d, 0x3d3677eb, 0xbe3e5b74, 0xbe60ff95, 0x3e9f159b, 0xbe8645b5, 0x3cb0795c, 0x3d2c447b, 0xbea5dde4, 0xbd286c0b, 0x3ed9b4ee, 0xbe23cc25, 0xbe10388a, 0xbe73a9d0, 0xbcfca1de, 0x3e921528, 0xbd65e33f, 0x3c22a4ef, 0xbe9abcd0, 0x3d9b952c, 0xbda6370e, 0x3d17e1f6, 0xbee3a3c2, 0x3dd9c9c4, 0x3d16f570, 0xbe78fefe, 0x3dd54084, 0xbe94d23a, 0x3e2291bc, 0xbe99f85a, 0x3d353b37, 0x3e77ab95, 0x3e7ad2e7, 0x3dad4b73, 0xbe673038, 0x3cd803b3, 0x3c76e1a2, 0x3dfb08b9, 0xbe870cf7, 0xbe7b6ba2, 0x3c141612, 0xbeaff205, 0xbc194422, 0xbd4f920e, 0x3ec35093, 0x3e531164, 0x3e859ee2, 0x3d1a477d, 0x3e848195, 0xbcf728df, 0x3e7bf5ed, 0x3e183628, 0xbedcfd56, 0xbe076b62, 0x3e16fb88, 0x3ea5f6ed, 0x3d5df355, 0x3be5dab6, 0xbe3c776c, 0x3d80a083, 0x3e911044, 0xbd8438d0, 0x3bd687fe, 0x3e4c4187, 0x3c8874eb, 0xbee6c0e4, 0xbd9fa82b, 0x3c639ea6, 0xbe516dbd, 0x3d1e2c3b, 0xbe835a51, 0x3ea96394, 0xbdfc30cb, 0x3d0d8d56, 0x3e9db42c, 0x3f11af80, 0xba60485d, 0xbdcfeca0, 0xbe0cf519, 0x3d3eb7df, 0xbc4df881, 0x3e7af662, 0x3d7ffbee, 0xbdb00e55, 0xbe8b808d, 0x3eabff94, 0xbc44ac08, 0x3e8a3e7f, 0xbd2c2ad1, 0xbd7aa553, 0xbe954a9e, 0x3dcc3957, 0xbd0cf1d0, 0x3edd3033, 0x3f0ddfcf, 0x3e242c2e, 0x3e451ce0, 0x3e6d9c9b, 0xbe95a244, 0x3e3d2477, 0x3d8821a3, 0x3de3036d, 0x3f1828af, 0xbecfaf71, 0xbe12b25c, 0xbea17d75, 0xbec0e0b5, 0x3dcbd801, 0x3d8b592a, 0xbdd08e92, 0xbe9b3583, 0x3e3569a6, 0xbee90213, 0xbd58f9de, 0xbccb3fba, 0xbda7800e, 0x3e96465a, 0x3e5d9332, 0x3e8e389e, 0xbc45ddff, 0x3ec2ddc8, 0xbe241251, 0x3eae027e, 0x3e5cbaf5, 0x3ec5faf5, 0x3df35e12, 0xbd481e3c, 0xbe6d65fe, 0xbeba7e58, 0xbf0529d8, 0x3e70831e, 0xbe5706e2, 0x3e8308e6, 0xbdf8099a, 0xbe6f2caa, 0xbe8c866d, 0xbdbae762, 0x3e2ef230, 0x3eb20996, 0x3d8dbc8e, 0x3e170e4a, 0xbe0f18c1, 0xbd2c0d59, 0xbbead16a, 0x3ef1ed01, 0xbbe5487c, 0xbeab20d5, 0xbe86a7d9, 0xbaeaf2a2, 0xbbbfc93e, 0x3e2ef6f6, 0xbe0cb041, 0xbddbd249, 0x3d3fe20b, 0x3e956e90, 0x3c030261, 0x3ec2db86, 0xbb5a7be0, 0xbe09508e, 0xbe16a416, 0x3e2d3dd3, 0xbedcbd21, 0x3e5ace25, 0xbf0c5679, 0xbec7e9f1, 0xbcd437da, 0x3d9cf194, 0xbe8c3d80, 0xbdb07d9e, 0x3e8b78d1, 0xbea9fd7c, 0x3db3df98, 0xbe68c869, 0xbe949850, 0xbebae046, 0x3e8c3c95, 0x3e23fe3b, 0xbe2a6fe5, 0xbe5619e6, 0xbe14d170, 0xbe921883, 0xbe966a44, 0xbdd95ef9, 0x3ec824c3, 0x3e82ea64, 0x3e2fc348, 0xbe1a801d, 0xbf443022, 0x3c775fbf, 0xbb11fb59, 0xbee26b7f, 0xbcc2a21c, 0xbc68d99b, 0x3e2bff07, 0x3ec5207f, 0x3d58d6e4, 0xbdce5902, 0xbdf28e3f, 0xbec84fa9, 0x3acd7166, 0xbe2e9c74, 0x3d31215b, 0x3e1cef2d, 0x3ea6de8c, 0x3dabcf19, 0xbeb7d0d9, 0x3dbd1dce, 0xbe1e09b4, 0x3e95f85a, 0x3d87b9eb, 0xbd3f8166, 0xbe0bd085, 0xbdd565dc, 0x3e3b29e2, 0xbe93ebf8, 0xbe64e55a, 0x3dd02828, 0xbe9eaaf6, 0xbe2c61c5, 0x3e874d7c, 0x3e29a8b1, 0x3e3c883f, 0xbd4f121c, 0xbcf9a226, 0xbdc919a3, 0xbd45cbd8, 0x3d4f9610, 0x3e4f3818, 0x3e4a6e3c, 0xbdc2a1c4, 0xbd2f4e75, 0xbe21da71, 0x3e7a8374, 0xbe1ac7d6, 0xbedb81e2, 0x3ddb414e, 0xbda5cf29, 0xbe4f2214, 0xbe8db6b1, 0x3e20371c, 0xbd8cd94e, 0x3e1598df, 0x3eab035c, 0xbd9ea28e, 0xbe1bfc34, 0x3f04e34a, 0x3eb662cb, 0x3d8a57ca, 0x3ed18a34, 0x3ec416d3, 0x3d102631, 0x3e903bc5, 0xbda1a67d, 0xbf23a882, 0xbe737bfd, 0xbc9bf190, 0x3e82c11f, 0x3ce766be, 0xbecba17e, 0x3a06272b, 0xbe3470ab, 0xbd4b419a, 0xbc79001a, 0xbdc1deb9, 0x3e458680, 0x3e6abf44, 0x3e3631c6, 0xbd67c4a1, 0x3e81fc8e, 0xbe5d2119, 0xbdb3bd4a, 0xbe7b6bdc, 0x3e6f58f2, 0xbf10d940, 0x3e8561da, 0x3e439f5f, 0xbeb92db7, 0xbc054c38, 0xbe78a559, 0xbacec8a2, 0xbc085bcc, 0x3ea9d1c8, 0xbd3afac6, 0x3dfa0fc1, 0xbe0bb6e8, 0xbe48dc2f, 0x3e9b33e3, 0x3d77b1f6, 0xbeb2fd64, 0xbebdabea, 0x3df4a7ba, 0x3dba2b8c, 0x3e89f1e4, 0xbe9135a8, 0xbbe00e11, 0xbd61cc39, 0xbda8f456, 0xbdb2c1a8, 0xbe50b83d, 0xbeff4bac, 0x3e9058c5, 0xbe360b53, 0x3ea3c1b6, 0xbc5f4e00, 0x3dc5d83b, 0xbdc77334, 0xbe2b712c, 0x3e25f793, 0xbcd47b02, 0xbe18560a, 0xbe85c55a, 0xbebc788a, 0x3efd95c0, 0x3e809fee, 0x3d68243d, 0xbe99f46e, 0xbd0fdc8e, 0xbe687170, 0xbec67d0e, 0xbecd76aa, 0x3e1544af, 0x3e26d8b0, 0x3ba2dabf, 0x3e967008, 0xbd8d7f15, 0xbebeeab6, 0x3e7f8b65, 0x3d8e6f0b, 0xbe79752a, 0xbea69174, 0x3e62b026, 0xbe24e1cc, 0xbe8360d6, 0x3d3bf34c, 0xbdac8f5e, 0x3eed050a, 0x3ebeba2f, 0xbed47a59, 0xbecc2463, 0xbdb239b6, 0xbe90ec5f, 0xbe8dc3bb, 0x3ed9b46b, 0x3e60ff01, 0xbdc83d9f, 0xbd3a5c22, 0x3e884850, 0x3e5cc04e, 0xbe8877e7, 0x3e0f34a2, 0x3e0e7b07, 0x3e81d252, 0xbe95934d, 0xbe1c479b, 0xbe54a5ad, 0x3ea83e4d, 0xbf033144, 0x3eb1b7ab, 0x3d591575, 0x3f04483f, 0x3e8cf549, 0xbc258835, 0x3d53835d, 0xbe3cb476, 0x3e2a4fdd, 0x3d9b4439, 0x3e8853b6, 0xbe981389, 0x3e012199, 0xbe4cd510, 0xbeb12b14, 0xbd30a81e, 0x3da901c6, 0x3da413ed, 0xbd829e80, 0xbe710b06, 0xbde08e6f, 0x3deedb54, 0x3b2ca14a, 0xbdf5b5ba, 0xbd3bf0b5, 0x3e0a2c57, 0x3ebba71c, 0xbce9a204, 0x3c74a6a7, 0x3e8b60cf, 0xbdba1627, 0x3e20fea9, 0xbea675c1, 0xbc59d40d, 0x3e7e7413, 0xbcacaa57, 0xbe050a30, 0xbe24d300, 0x3e5beb39, 0x3d02d61d, 0xbdef64a1, 0xbe2d1a98, 0xbd98746d, 0xbe8114d4, 0xbe0d9b17, 0x3dd84922, 0xbf0f300b, 0x3e0f99c5, 0xbf089edb, 0xbe1392de, 0x3d98d855, 0x3e95d6b7, 0x3b80b21d, 0x3eebd5c3, 0x3e85a5d4, 0xbde9c405, 0x3e8693cc, 0xbeac09ac, 0x3a13e8b5, 0x3e8b153d, 0x3dbbf14d, 0x3c82b85f, 0xbec83a20, 0xbd0f876b, 0xbe8ef1f1, 0x3e034462, 0x3c280c43, 0xbdaca968, 0x3e82b4be, 0x3bf35e6f, 0x3ebd3833, 0xbc13786a, 0x3e0919ec, 0xbe9be5fd, 0x3e3e426a, 0x3e375790, 0xbdd7744f, 0x3e878ca8, 0xbe8559d8, 0xbee1bd57, 0xbcb84f7a, 0xbed63320, 0x3e2e621b, 0xbe727687, 0x3e3ed47e, 0x3da065dc, 0xbec3b151, 0xbd459845, 0xbd724e71, 0xbeb6f052, 0x3daf0c93, 0xbc91e2bf, 0xbd124484, 0x3d89f4b6, 0x3d9db9fd, 0x3e67f2ab, 0xbe245f3c, 0x3d892d4e, 0xbed51c43, 0xbca3d7d0, 0x3e2ad620, 0xbda70934, 0xbc4f3c75, 0xbdb10dd2, 0xbd9f8130, 0x3c8d5c1a, 0xbd7d1db2, 0xbda9e71c, 0xbe05a1a8, 0x3e778b0e, 0x3e25c20b, 0xbe55efac, 0x3dc70a68, 0x3e75024e, 0x3dfe9cc8, 0xbeaa3e56, 0xbd14fe82, 0x3e03daf4, 0xbd6a85aa, 0xbd14bb1b, 0xbdfd231f, 0xbdf1f808, 0x3dfd349b, 0x3e84104d, 0xbe7fddc9, 0xbe7c5452, 0xbe367040, 0x3d953242, 0xbc24b243, 0xbd6f5d87, 0x3e04927c, 0x3f118edb, 0xbd6441d0, 0xbe3909eb, 0x3e025d72, 0xba00e06a, 0xbd38ee19, 0x3db917b4, 0xbec4d205, 0xbc069e37, 0xbce15095, 0xbca2bc9d, 0xbec394d2, 0xbebcb9af, 0x3e1c82e2, 0x3efe0647, 0xbdd64300, 0x3d0a3180, 0x3d38647c, 0xbc872ce4, 0xbda035ec, 0xbd89392b, 0x3e1b14ec, 0x3e410d66, 0x3e1f34d4, 0xbead983d, 0x3d52f15b, 0xbe218f25, 0xbd814653, 0xbe92f903, 0xbe1a5ddd, 0xbe0c4d97, 0x3e066a6c, 0xbd6360b7, 0x3dc7e658, 0xbd806f77, 0x3d514c37, 0x3e15b8fa, 0x3d0e68e2, 0x3d166b47, 0x3e8eb829, 0xbebe665a, 0xbe20ef9a, 0xbea6c1e6, 0x3d8cd0eb, 0x3e34550a, 0xbd63a271, 0xbe76988a, 0xbe528fac, 0xbecdf977, 0x3ec8744b, 0x3db79591, 0x3e813fad, 0x3eb4fbbf, 0xbe38d65f, 0x3d3e4a42, 0xbe86f40b, 0xbe31d00b, 0xbeaa61e3, 0x3ef625d6, 0x3c998f92, 0x3e0ac022, 0x3f188fad, 0xbe5e0827, 0xbe3184cb, 0x3d3e5e6f, 0x3c84671d, 0xbeb1de8e, 0xbe2fb57c, 0x3dd90645, 0x3ec43277, 0xbeb49631, 0xbd47db6a, 0xbea16240, 0x3d469712, 0xbea54be0, 0xbe28a16a, 0xbeb91e24, 0xbe2a8f49, 0xbe22bd21, 0xbe4e1742, 0x3dab236e, 0x3d64ab71, 0x3e84ad57, 0xbe6dbe79, 0x3e1131f4, 0x3ebe6595, 0x3e9019c9, 0x3da09e29, 0xbebc07bd, 0x3f093e03, 0x3e1510d9, 0x3d32a8f3, 0xbe38ac03, 0xbe470625, 0x3e82bc8d, 0xbdfc7374, 0x3ecdc5ce, 0xbe694d63, 0xbea5a435, 0xbd194ccc, 0x3d66213c, 0x3db969cf, 0xbe1d547d, 0x3e7e2af4, 0xbc9a8247, 0x3e5e85a0, 0xbdf56d6c, 0xbe309b42, 0x3c918282, 0x3ec96d09, 0x3da7529e, 0x3ca57210, 0x3ddeb2b8, 0xbe8daed2, 0x3d27e5d7, 0xbe63450c, 0xbdf1a1c3, 0x3e095774, 0x3d53921f, 0x3e10c685, 0x3dd9641d, 0xbf0367a4, 0xbd5912ca, 0xbef3a6fc, 0xbd77c057, 0xbe176d1a, 0x3e1a0757, 0xbdf8835b, 0x3d84cd45, 0x3e43dafc, 0xbd21dc50, 0xbe1c408e, 0x3dec262e, 0x3e6f9063, 0x3d436c40, 0x3e619998, 0x3d2dbd14, 0x3d14f477, 0x3e5a428a, 0xbdc4240b, 0xbe2c5aa4, 0x3e140928, 0xbd0662a9, 0x3eb03f76, 0xbcadcd86, 0xbde02c24, 0x3d956666, 0xbee641a7, 0x3ea6f0a1, 0x3e57490c, 0xbddc1931, 0xbdd40422, 0x3d9f5836, 0x3e49dc57, 0x3dfd523c, 0xbe22f062, 0xbe13fd76, 0xbeaa3a12, 0x3d19fa34, 0xbe937b97, 0x3e98b9ba, 0x3de14caf, 0xbd16f30c, 0x3e73ccc6, 0xbeb1f75d, 0xbde14129, 0xbded9eb4, 0xbcb0f984, 0x3de87b7d, 0xbdde831a, 0x3e492025, 0x3ec342bf, 0xbe7d6689, 0xbe6e37f0, 0xbe2a1b9e, 0xbe57f318, 0xbed51962, 0x3e542df7, 0x3dee66f9, 0xbc22fc25, 0xbdcc48d1, 0xbe5aece4, 0x3e6216a4, 0xbe1edbd6, 0xbd5bc04e, 0x3e7c8dff, 0x3e2ac368, 0xbdaf44ac, 0xbe6e7f05, 0x3de09d16, 0x3dae3d64, 0x3ea04037, 0x3e32d984, 0x3ee19eb3, 0xbde90fa2, 0xbe641f00, 0x3d5b7022, 0xbc3cda16, 0xbc85b32d, 0x3ed1af0f, 0xbe81a62a, 0x3e47e6e1, 0xbe0e6cef, 0xbd941055, 0x3e0aecd9, 0xbe30d4ae, 0x3da3523a, 0x3d86e095, 0xbe54f86f, 0x3f061430, 0xbe5bbf9f, 0xbdd76aa5, 0xbdf092b3, 0x3d3a3021, 0xbdf60410, 0x3e57513b, 0x3dba86e5, 0xbbf14f51, 0xbe92a2ca, 0x3d687149, 0x3dcd5699, 0xbe1927af, 0xbdc4a8d3, 0x3dd7c9b6, 0xbe3b29d4, 0x3e7061e4, 0x3d8f3d50, 0x3e488065, 0x3db1cd81, 0x3cc86e56, 0x3e66af75, 0x3eacbedb, 0x3e8f2b4c, 0xbe93ec69, 0x3e904589, 0xbdff74c9, 0x3e11895d, 0xbe900abd, 0xbeb2898d, 0xbddf73f4, 0x3db1d313, 0xbd306600, 0xbddf529f, 0xbcc59ef2, 0x3d8f1552, 0x3ecba4fb, 0x3e8eca9b, 0x3ca08d1b, 0x3e99b84c, 0x3e7083c8, 0xbe4524f4, 0xbd888ca2, 0x3e858198, 0x3f0924f8, 0x3de7effc, 0xbe65fde9, 0xbbf6c4fb, 0xbdbe9280, 0x3ebfcd4f, 0x3e709abe, 0x3da310ce, 0xbeafc306, 0x3e5a6bef, 0xbe2dc7f0, 0x3d1f5bae, 0xbdb59e10, 0xbd0b3100, 0x3f049a71, 0xbe507ecf, 0xbd269d79, 0x3eb59317, 0xbea5cf62, 0xbe615169, 0x3ecb71ac, 0xbb2fc1bf, 0xbe8e25e7, 0xbd3a0ee5, 0xbef0f533, 0xbe09362d, 0x3eb4e8a5, 0xbe8f299b, 0x3d813e4a, 0xbeb47f0e, 0xbc868514, 0xbe1d9fa3, 0x3eb99e35, 0xbd95cfda, 0xbe7ea342, 0x3da49376, 0xbe89ce2f, 0xbb03cfd3, 0x3ea5e531, 0xbd121405, 0xbd0ef616, 0x3e9f7ec7, 0xbec3d1aa, 0x3e8bed3a, 0xbe6ed407, 0x3e0d9441, 0xbd584065, 0xbe667fa1, 0xbd459efe, 0x3d37c05b, 0x3da701c6, 0xbdaa56e8, 0x3e103645, 0x3d755f25, 0xbeeaa54f, 0xbe938c81, 0xbdf1fdf9, 0x3d1e1c77, 0x3f027768, 0xbe5f1aad, 0x3e0e0397, 0x3d3d397a, 0xbe9e807e, 0xbe6a337a, 0x3ecd6a31, 0xbe6ea40f, 0xbdfe867a, 0x3f1e0888, 0xbf2d2f0c, 0x3e8bb2e2, 0x3d984799, 0xbe801f68, 0xbc76734b, 0xbd81f1cc, 0xbd36c981, 0xbd7140bb, 0xbdaab19e, 0xbca38104, 0xbeb222b3, 0xbde23975, 0xbe62f95a, 0x3def7b65, 0x3dc6773e, 0x3ddf20c4, 0xbdb66811, 0xbe8fa244, 0xbe15d9f3, 0x3e9c2c57, 0xbe7eb28e, 0x3d669e55, 0x3e1e3213, 0xbd5f0796, 0xbe377a34, 0x3ebfd63e, 0xbe65e16c, 0xbedfc363, 0x3dce0123, 0xbdfae811, 0xbf1b260c, 0x3de23559, 0x3d44614c, 0x3d174316, 0x3e42bc6e, 0x3e773f0a, 0x3dfe4798, 0x3db563cf, 0x3e600ed8, 0xbe7964a1, 0x3ddc613b, 0x3efe65de, 0xbea0f09f, 0x3e6c0a37, 0x3e0d4032, 0x3e38ea33, 0xbe50afd6, 0x3dde675e, 0xbe453746, 0xbcbfa570, 0x3f1d0283, 0xbe452768, 0x3e2c7709, 0x3d298d90, 0x3ee73827, 0x3e9a1076, 0xbe52e6e4, 0x3ec2da04, 0x3e0b1718, 0x3e87be21, 0xbdcf40f3, 0x3dae7d50, 0x3c9a5b21, 0xbe281a82, 0xbe8e557b, 0x3e15216e, 0x3e679154, 0x3d5f80ac, 0xbec06467, 0xbe1ed622, 0xbeeb297a, 0x3d261249, 0xbd950cf4, 0xbe5ead19, 0x3ddf0476, 0x3ef492f8, 0xbe507127, 0xbf1d2112, 0x3bb08b0d, 0xbd8b49bd, 0x3e7eb937, 0x3d01e09e, 0xbdb2bdb7, 0xbe570759, 0x3e4c5542, 0x3ec7da3c, 0xbe4452a3, 0x3b139092, 0x3e378ec9, 0x3e273293, 0x3dc7280e, 0x3e584d4b, 0xbe56ce49, 0x3edbb351, 0xbd2751a4, 0xbdcf7876, 0xbf00ed0c, 0x3e20b7ae, 0x3e8562e6, 0x3e9f1b5c, 0x3d3c6b31, 0x3cd7ca81, 0xbeb696f7, 0x3dfe6aa1, 0x3df3eaea, 0x3e00b365, 0x3e2e7b1a, 0xbd2eb34a, 0x3e48501c, 0x3e4f7cac, 0x3ee165d0, 0xbdb08273, 0xbf0cdcf1, 0xbf0cbcd2, 0xbed7cc5e, 0x3ca62e68, 0x3db76573, 0xbe4bc75c, 0x3baee7a2, 0x3e5512b2, 0xbe030ce4, 0x3e1bfbe3, 0x3e05b4e7, 0x3e63d66c, 0x3ea103a8, 0xbe7d756a, 0x3e76dc14, 0xbcdef241, 0x3e11e1a9, 0xbeee677b, 0x3e80ece2, 0x3e5b2b7e, 0xbe9fa276, 0xbdcf051c, 0xbe416c8a, 0xba2bd4fb, 0xbe7ff30b, 0xbd8d3fa8, 0x3d65bd32, 0xbcbe5bcc, 0x3e4a4dce, 0x3efc50cb, 0xbd9241b7, 0xbe5c96e4, 0xbf030f04, 0x3dfb8554, 0xbe83edf2, 0xbabea7f5, 0xbd8e2469, 0x3d88bb75, 0x3e93684a, 0x3e895e16, 0xbdc87d83, 0xbe9b4102, 0x3bcc4406, 0xbf016f47, 0x3f01b268, 0x3d2bd93a, 0xbedb9286, 0xbcade4f5, 0x3e429c16, 0xbcbb1838, 0xbe814337, 0x3c3c9a14, 0xbe63afbf, 0xbec86237, 0xbe1e1bd7, 0xbe19fe60, 0x3ed553e4, 0xbd7e6a4e, 0xbe9ef04b, 0x3edacd15, 0x3d06e7c6, 0x3d6d5a70, 0x3e04c100, 0xbdf178fb, 0x3e582f3e, 0x3d9aa0c4, 0x3c651da0, 0xba44938b, 0xbd818d7a, 0x3dc67c1c, 0xbda660fd, 0x3e03c4c0, 0xbd5d8e45, 0xbe3c5b00, 0x3e3b914f, 0x3e43bc8f, 0x3e1c3495, 0x3e8fb1a2, 0xbdf841ca, 0xbde623ae, 0xbcc59238, 0xbc94ae3f, 0x3f1bf341, 0xbe0cc3c7, 0x3d99626e, 0xbe03b910, 0xbe9e0fcf, 0xbdcd5175, 0x3d941655, 0xbd8512c5, 0x3e4dcd2e, 0xbd8d42da, 0xbb0ad897, 0xbda46a2d, 0xbd0e917d, 0x3df5e3ad, 0x3e9e4478, 0xbeb14208, 0x3d6282a8, 0x3eaf5101, 0x3ed7373e, 0x3e3e85b4, 0xbba9fbbb, 0xbb14d17f, 0xbee19108, 0xbe08748b, 0xbd7d3e86, 0xbe5ea085, 0xbee60041, 0x3d1c2499, 0xbe5ed1b2, 0xbd4c7059, 0x3e5b5df1, 0xbd4a1c7a, 0xbddb3a33, 0xbe7cc912, 0x3e716597, 0x3e8fb827, 0x3d1be482, 0x3d991354, 0xbdfb8487, 0xbde01107, 0xbdcadef3, 0xbd93a3cb, 0xbeac4746, 0xbeb7536d, 0x3d84aed5, 0xbcd753c2, 0xbd8a7666, 0x3ea107ec, 0xbd4c8131, 0x3e3f5b75, 0xbebca96a, 0xbeac8169, 0x3d845776, 0xbdd605a3, 0x3cf2b27c, 0xbe058c9b, 0xbe18ede4, 0x3dcad8fc, 0x3ed17659, 0x3d90777e, 0xbc8f2402, 0x3a92ce4d, 0xbe5ecdf6, 0xbe684f08, 0xbdba097d, 0xbe64eb16, 0x3e50a219, 0xbe7c0758, 0x3e7e1111, 0xbf15af98, 0x3db12616, 0x3edd4a36, 0x3e56f405, 0xbe9d52c1, 0xbde0fd8a, 0x3e1a6cff, 0xbdcaf4f6, 0xbe8ec4b3, 0x3e219d4e, 0x3e616bae, 0x3e7bd2d6, 0x3aecce4c, 0x3e2cf516, 0x3e973604, 0x3d1bcdcc, 0xbe724d26, 0x3e6b1eb0, 0x3d6ebd1a, 0xbe4341ee, 0x3e8367b1, 0xbd715b8e, 0x3ea1f6ab, 0x3e08c461, 0xbea2f04d, 0x3e86af8e, 0x3ea91486, 0xbe0dae7c, 0xbcc49beb, 0x3e22e5b8, 0x3dbc3b68, 0xbca998ee, 0xbded29c7, 0x3e5ce978, 0x3cc26b43, 0xbc75a76a, 0xbe15767d, 0x3cfc89e9, 0xbe2642fa, 0xbdf4a60b, 0x3dfa9ae9, 0x3dc2aabf, 0x3bef6ff8, 0xbea0dddf, 0xbb8de2f7, 0x3e15d489, 0x3cf76684, 0x3f1e81c7, 0x3c9bcfd3, 0x3e79d189, 0xbe660b3a, 0xbd45b5b8, 0xbd72a641, 0x3d49daf8, 0x3c9177ff, 0xbcc99603, 0x3e4d5d2e, 0xbe44ec30, 0xbd9fcf15, 0x3d04f1a0, 0xbedab820, 0xbe9ef550, 0x3da8b574, 0x3e3a5deb, 0x3e1e16e8, 0x3ea317d6, 0xbd83f652, 0xbed75a5e, 0xbe346882, 0x3eaf66d8, 0xbe839471, 0x3e80d9ff, 0x3d9e1398, 0xbdbfb73b, 0x3d9edc5e, 0x3d377963, 0xbdc2a40d, 0xbcbcbee8, 0x3e8eb1c7, 0xbf180e89, 0xbdb4bd4a, 0x3d67f498, 0xbdbe3725, 0x3f0548d9, 0xbedf60fe, 0xbdfefb9a, 0x3e4d7cbd, 0x3e0e0a1f, 0x3e8b8ef5, 0x3eb45154, 0xbe159304, 0x3f098559, 0xbebffa06, 0xbdf7d389, 0xbe43d2e0, 0xbd0f6293, 0xbe821945, 0xbdab4e69, 0xbe28393f, 0x3e05a613, 0xbe34c668, 0xbe8a1f2b, 0xbdc78905, 0xbee8e585, 0x3e36ceb8, 0xbe9b23ba, 0x3e8d2302, 0x3ecb0ad7, 0x3defcb9a, 0x3e3420af, 0xbeac3388, 0xbdc1521d, 0xbd42b6e0, 0xbee20de2, 0x3d809460, 0x3c8fa826, 0xbbbef01f, 0x3e608b74, 0xbe9701bb, 0xbe6e757e, 0x3ce50383, 0xbe198d19, 0xbe07990e, 0x3c4ce944, 0x3e44829c, 0x3e912707, 0x3e75a1df, 0xbe4a5617, 0xbe889337, 0x3e420556, 0xbe55a671, 0xbe9dd609, 0x3ea793d8, 0xbe8f4cdf, 0xbe309ace, 0x3e8980bf, 0x3ebce5cb, 0x3ef95a33, 0xbde24ae2, 0xbe99fed8, 0xbf02afc5, 0xbeeaa413, 0xbe166b63, 0x3dc23356, 0x3e789471, 0x3dee78d9, 0x3e875a39, 0xbdd6470b, 0xbe1c5498, 0x3e71102d, 0x3da45322, 0x3e8287ce, 0xbeb50179, 0x3ee8cb74, 0xbeb11d1a, 0x3e670bb1, 0xbe5c25c5, 0xbe14160f, 0xbe071b4e, 0xbec338d5, 0xbe9d07c0, 0xbe4956ad, 0xbd012bdf, 0x3ef4cad2, 0x3eb45ad0, 0xbe4ad9b9, 0xbe63cfc5, 0xbf106646, 0x3db0f1e3, 0xbe59d154, 0x3d46fa99, 0x3ec10655, 0xbef3900c, 0x3e14a808, 0xbda0a971, 0x3d1af59e, 0x3b580b1c, 0x3c8defe5, 0xbe685ab8, 0x3d7977d1, 0x3c87c5a1, 0xbcc675e6, 0x3d01ea97, 0xbe759519, 0x3efd6f65, 0x3e3412f4, 0x3dc65031, 0xbda351cf, 0xbd98c793, 0xbcef991b, 0xbe80e4ab, 0x3dc5c048, 0x3e1c9ec3, 0x3e5f6d96, 0x3ef2ac59, 0xbb5dd22b, 0x3da13e8e, 0x3e031760, 0xbdec4998, 0xbe3d4856, 0x3e58f8ee, 0xbdcf0de2, 0xbe66614a, 0x3ec0a1ff, 0xbde8e5d7, 0x3ed7adea, 0xbdddd5e0, 0x3bcbe1a9, 0xbe496451, 0x3d91d1c2, 0xbebe7a0e, 0xbeb1a9d2, 0xbea6fc52, 0x3f195688, 0xbf0f039f, 0x3e86f594, 0x3d799ed9, 0xbe753c34, 0x3e91c224, 0xbd6c1c1e, 0x3c5bd791, 0x3e81e700, 0x3e91cb13, 0x3e98eded, 0x3f1f4482, 0xbe8154bc, 0x3eec83f4, 0x3d0c99ce, 0xbe34be91, 0x3da8f453, 0x3e93c249, 0x3d549642, 0xbd91df3e, 0xbe155864, 0x3d9966aa, 0x3e057925, 0xbde7dfe9, 0xbe027a8c, 0x3c1a8ce8, 0x3e9f2849, 0x3ed9d351, 0xbca9c56a, 0xbdb84d62, 0x3e919012, 0xbe672fa5, 0x3e5e4459, 0xbdc03bfb, 0xbe0493e3, 0x3e842563, 0xbb16d992, 0xbe8e8cb0, 0xbd51f239, 0xbefeb816, 0x3e74552b, 0xbe175123, 0xbe75eb80, 0x3d11bdb0, 0x3d7c9083, 0x3d9ea693, 0xbd379269, 0x3dfa791b, 0x39b441af, 0x3e4a63b6, 0x3c7b386c, 0x3c6a946e, 0x3d934e95, 0xbdbf1dc7, 0xbdf36c3d, 0xbe71ab0f, 0x3f05708f, 0x3db96003, 0xbd3448f9, 0xbd327776, 0xbcb8dca8, 0xbdda94e1, 0xbea1b930, 0x3ee43427, 0x3dd3ba54, 0xbe3aaeaa, 0xbcc8ccbd, 0x3d8d6ce0, 0xbdac5125, 0x3e11f6ac, 0x3ec45070, 0xbdf73b01, 0xbde026a4, 0xbdb68eb2, 0x3e295b56, 0xbe09e935, 0xbe4758e7, 0xbee56f17, 0xbef48f77, 0xbea6f202, 0x3d0f9ea8, 0xbe8577a5, 0xbdf132bf, 0xbd828690, 0xbe272c66, 0x3e48e605, 0x3cdbab0f, 0xbe3d2c57, 0xbd23ebac, 0x3e21321b, 0xbde708dd, 0x3d4f1ddb, 0xbe799b05, 0xbeeb7780, 0x3ec04e46, 0xbe56c280, 0xbeac6a8e, 0x3e5146c6, 0xbdb9aad2, 0x3d834571, 0x3ec46657, 0x3de002d8, 0x3dc0c94b, 0xbe151e96, 0x3eaa2864, 0x3df9f3e0, 0x3ec59992, 0x3d4bd1a0, 0x3e0de3a2, 0xbe2ced99, 0xbe859ef7, 0x3f230d04, 0xbcef0a36, 0x3f2445c9, 0xbd597a3c, 0xbe0da862, 0x3ede484f, 0xbe9f1762, 0x3e73f3d4, 0x3af6f7d9, 0xbeb10d4c, 0xbed721e9, 0x3b9f968d, 0x3f066b27, 0x3d25c7e6, 0x3d2d2a01, 0x3db8b564, 0x3e9726c1, 0xbddcc5c2, 0x3eee18b7, 0x3dc6634a, 0x3dbcedd1, 0xbdd495df, 0x3e36b816, 0x3e5db086, 0xbf45161a, 0x3dbfa1f2, 0xbd16bbab, 0xbe9f193b, 0xbe82e1b1, 0x3de5d6db, 0x3e3e157e, 0xbe5a6827, 0xbe0a6fea, 0x3db5a330, 0xbe4a0ffb, 0xbe5c959a, 0x3da533ed, 0x3e3db39c, 0x3f29ef8e, 0x3eec17c6, 0x3d5d51c3, 0xbd4129f1, 0xbe41d0ee, 0xbeecf82d, 0xbd53b83d, 0xbebb79ca, 0x3e9fc4d7, 0x3e78b8f1, 0xbd64434b, 0x3ee2e071, 0x3e21f2d4, 0xbeb1b4f5, 0xbe184928, 0x3e92bfc3, 0xbdb8f132, 0xbe314388, 0x3dc7a458, 0x3d8c80b9, 0x3f040295, 0xbe609948, 0x3e9483ee, 0xbed52ea9, 0x3be91a59, 0x3e1f2692, 0xbde4b2a8, 0xbd48c26a, 0xbd99ff4e, 0x3e83ad21, 0xbe71bd62, 0x3eea941c, 0x3e403fc2, 0x3d850c17, 0xbdd4cb7f, 0xbd3873e4, 0x3d98130c, 0x3ee72904, 0x3e18320b, 0x3d7c300f, 0xbea8ef1f, 0x3d98d593, 0x3e5e557f, 0xbe88abf2, 0xbf3b1011, 0xbd1fa8f6, 0x3d977f14, 0xbb121851, 0x3e6420c2, 0xbe1550f4, 0x3d5197ee, 0x3e2623ff, 0xbf0e1e8d, 0x3d0e33dd, 0x3ec8d541, 0x3dc6a33d, 0x3e291a54, 0xbebf98e7, 0xbd58abf5, 0x3da774b6, 0xbe42b27e, 0xbed07e0e, 0x3eb7a9bd, 0xbe9f30ff, 0xbca08700, 0x3e483870, 0x3ea64610, 0xbdc854f7, 0x3d7b30bc, 0x3e7f1d40, 0xbe114085, 0x3f13bb04, 0x3d363bdf, 0x3d616246, 0x3d5f0fd1, 0xbdafccd9, 0xbeba78c6, 0x3e446a17, 0x3e37e625, 0xbe89a9bf, 0xbeb94166, 0xbd417774, 0xbe58b94e, 0x3e7bb437, 0xbe281d91, 0x3c48f023, 0x3c518de4, 0x3e142f63, 0xbe00cefb, 0x3c8699eb, 0x3e27060a, 0x3e30a107, 0xbced0df6, 0xbe319f90, 0xbda85628, 0x3e607adb, 0xbdb4be3c, 0x3e6bc87d, 0xbea1ae62, 0x3d077a35, 0x3cf257a3, 0x3ea41410, 0x3df6552a, 0xbe451ee2, 0xbe178f64, 0xbe5f58a8, 0x3df4aefc, 0xbe805677, 0x3cdfca40, 0xbef25125, 0x3eecf843, 0x3cb40dae, 0x3e44a5ec, 0x3d91e065, 0x3d8ff79b, 0xbd421592, 0xbe033cb7, 0xbf0246e7, 0xbe478dca, 0xbe91a5af, 0xbec73058, 0x3cc9de07, 0x3d86d0dc, 0xbd2ed7ba, 0x3e2217e4, 0x3da657e3, 0xbeb6dc64, 0x3debbb34, 0x3d7c7d86, 0x3de7f75a, 0x3d3a6d56, 0xbe6837f3, 0x3ea7c36e, 0x3b9c6df4, 0x3e654247, 0x3ea7b4f6, 0xbd9e63d2, 0xbdce34c2, 0x3f01c248, 0xbee27c7f, 0x3dfc0a10, 0xbe6c619c, 0x3e2ecffa, 0xbda3a495, 0x3db23893, 0xbe58a0a6, 0xbdff2699, 0x3dc4def9, 0xbe8afb07, 0x3d0312e9, 0x3e686212, 0xbeda1e02, 0xbdcce19a, 0x3df79452, 0x3e211976, 0x3f1921b0, 0x3e46aca9, 0x3eb11366, 0x3e923a23, 0xbe7af792, 0xbd18e7db, 0x3cbca7cc, 0xbdd1a820, 0x3dd6ab70, 0x3f283261, 0x3edbe095, 0xbdc55e78, 0xbd9a7f4f, 0x3e816bdd, 0xbe912e52, 0x3d0de79b, 0xbee4b727, 0x3e933102, 0x3e2970c0, 0xbe1b901b, 0x3f0852a6, 0xbd53dc8d, 0x3f0d18af, 0x3eb86fd3, 0xbe2f4d06, 0xbd1b70ad, 0xbdea496e, 0x3cd81ce4, 0x3e9fd80f, 0xbe52c3fc, 0x3f257269, 0xbe501b92, 0x3c71bc90, 0xbea509a3, 0x3cf6bbd7, 0x3dc72630, 0xbdaed6d9, 0xbe05cd2f, 0x3ed55e27, 0x3d5091b1, 0x3b25a911, 0x3ebb62c3, 0xbea8c283, 0x3ce1c3d5, 0xbe3fec54, 0xbe338080, 0x3ccc3fa4, 0xbe44450d, 0xbee1e849, 0x3d531e75, 0xbc80549c, 0x3e98c6d8, 0x3dc2e978, 0x3dc93595, 0xbd934aa3, 0xbdd4e83b, 0x3e20b546, 0x3ca51e7f, 0xbe3beb15, 0xbead4bce, 0xbdefcc51, 0xbdc59bbc, 0x3ec89bf4, 0x3e0ad74a, 0xbe5a8e0c, 0x3c7391f4, 0x3d2bcbdd, 0x3d8a5b84, 0x3e87e61e, 0x3da9c515, 0x3ddd4d1c, 0xbe8f0314, 0x3e1b9f15, 0xbe9c6334, 0xbe38d77a, 0xbe455e01, 0x3e6a0785, 0x3dae8945, 0x3d004526, 0x3e68f01d, 0xbe48e13f, 0x3e05a096, 0x3e40e4bf, 0x3ef162c3, 0x3e99e0ba, 0xbe4523c8, 0x3e65e390, 0x3dbe906c, 0x3d742d0f, 0x3e73897f, 0x3dbe579f, 0xbdd04e84, 0xbd8a3625, 0xbe996ce6, 0xbe11fc0f, 0x3e439b81, 0xbec68f5b, 0xbe2cd940, 0xbe198f0e, 0xbeccecbe, 0xbed727d9, 0x3e4e56ef, 0xbd069de7, 0xbe414141, 0xbdb926f2, 0x3da2c0b3, 0xbbe42b59, 0x3d9af52e, 0xbe91bcc1, 0xbe8849a9, 0xbde8af55, 0xbdf84e57, 0x3eb2d5b0, 0xbe90d3da, 0xbdd9f039, 0xbecbdad1, 0x3e069903, 0xbd65df79, 0x3c155e23, 0xbea69e4b, 0xbe8f191b, 0xba8f61ec, 0xbe9a965e, 0xbed32716, 0xbe4dd85d, 0xbd8854a9, 0x3de0d388, 0x3eb218c1, 0xbd624fc1, 0xbdf37f0d, 0xbe2f822a, 0x3e6732e2, 0x3e8aba2a, 0x3ea606aa, 0xbd871da9, 0xbeaa6ce5, 0xbe02f2b8, 0xbde0dabb, 0x3f032b45, 0x3d05e613, 0x3e17fb9e, 0x3de68f44, 0x3e1c103f, 0x3eb647fa, 0xbe169d00, 0xbcc4ea84, 0xbd9be024, 0xbe7a5222, 0xbd747188, 0xbdd33ecb, 0xbea502fb, 0xbed5bcec, 0x3d92abdc, 0xbe3d1c8d, 0x3d6ee906, 0x3e169e0f, 0x3e8c706a, 0x3d5bbd0b, 0xbd900194, 0xbe00a06c, 0x3e00393f, 0x3e5e7cc6, 0xbd2a991e, 0xbe18d3b8, 0xbd113326, 0x3dcedddf, 0x3d8cb140, 0x3e797c35, 0xbe8f5746, 0x3e21b9aa, 0x3e99b26d, 0x3ef0bbcb, 0x3ec407eb, 0x3e4943a4, 0x3db101fd, 0xbe0406e5, 0xbe3fab5f, 0xbca49fa7, 0xbde3aae5, 0x3e10fc53, 0xbe99bf6a, 0x3e0753a8, 0xbdaee722, 0xbd50d28d, 0x3dcef2ab, 0x3e84ac47, 0xbeaef0fc, 0xbe43e9f6, 0x3e02e851, 0x3b48efa7, 0xbd4e291f, 0xbeaf823a, 0xbe680f77, 0x3e89ff1d, 0x3d4ab407, 0x3d893f93, 0x3cd441e7, 0xbd7b28d0, 0xbf092008, 0xbec42b75, 0xbda24dec, 0xbd4cc634, 0x3ecabc1b, 0x3d5a1739, 0xbed0543b, 0xbe6d690b, 0x3cd1184a, 0x3edc02f3, 0xbdc0bc7b, 0x3d153012, 0x3ea135f6, 0x3dd6e5ed, 0xbc449174, 0xbd03faaa, 0xbed26095, 0xbbd67ead, 0x3dd9e820, 0xbe25ce10, 0xbc3c8328, 0xbc520232, 0x3ca1efa1, 0x3d37bcfb, 0x3d86b8b6, 0x3e817836, 0x3eb2202e, 0x3e16b78e, 0x3c91b77c, 0x3e89692f, 0x3db8124b, 0xbe8a65a5, 0x3e791b6c, 0x3d2f382a, 0xbc8330d4, 0x3e004846, 0xbe96cb89, 0x3ec61c72, 0xbdfd6bb2, 0xbe0185e7, 0xbda5ce23, 0xbe0068c1, 0xbea42172, 0xbe97c8ab, 0xbeb25eec, 0x3e65e60c, 0xbe684dc3, 0xbe08fefd, 0x3d05a2ad, 0xbe07e7b6, 0xba98a378, 0xbc8a23f6, 0x3dc8e9c1, 0xbecd1d0c, 0x3e6eecf1, 0x3dfcdd16, 0x3ee8ea90, 0xbdb1d6d9, 0xbe328d14, 0xbe5da49c, 0xbe9bf666, 0x3d9e2c12, 0xbd822dab, 0x3e7f31e6, 0x3f08dab1, 0xbe2a73f8, 0xbf04180b, 0x3e822249, 0x3d28047c, 0xbdf87e31, 0x3deaf970, 0x3e48f6df, 0xbeae7b07, 0xbd8ab047, 0x3d1aa535, 0x3d9c0d34, 0xbd99e014, 0xbd07205c, 0x3ea49c33, 0x3f17ca3c, 0xbed0be03, 0x3e1ead99, 0xbe5ba84a, 0x3da65274, 0x3e2b00c4, 0xbda124ec, 0xbd895b55, 0xbd42891c, 0x3c9d2a4a, 0x3e1893ba, 0xbcfbabe6, 0xbf032490, 0xbd03415b, 0x3e1467b2, 0x3e1c4a68, 0xbe116954, 0xbe76c20b, 0x3da45f13, 0x3e20f460, 0x3e7d9333, 0xbed108db, 0xbe3c55eb, 0x3df3cfd0, 0xbd3466f2, 0xbe4fb1ee, 0xbd165a0d, 0xbe374e56, 0x3da741e8, 0x3d945073, 0xbd0f3372, 0x3ca7f585, 0x3e24f76b, 0xbd24c8a5, 0xbe8f3ae4, 0xbc812ade, 0x3ec1ef9f, 0xbe3bb311, 0xbe82dcc1, 0xbf10c166, 0xbeb995e1, 0xbdef4ca3, 0x3bb0a5c7, 0x3db8abc0, 0x3eae7848, 0xbdeba6f2, 0x3d41a50f, 0xbdb4405a, 0x3f1b62c9, 0x3e2766b5, 0x3e518b0e, 0xb7b5a65b, 0xbecba8e4, 0xbd9d9c43, 0xbed1fc13, 0x3e9349f1, 0x3d16d594, 0x3f1704a3, 0x3f1b41c8, 0xbc428092, 0x3dccb0bc, 0xbe616437, 0xbe5170a5, 0xbda681cf, 0x3ea5b528, 0xbb25a8bb, 0xbb06c94b, 0xbee2362c, 0x3ee0f851, 0x3e591a60, 0xbdcd8758, 0xbd89ed7d, 0x3c7f74a0, 0xbea7e314, 0xbe8787a0, 0x3d03b682, 0x3f022da6, 0xbd9a5a50, 0xbd2fc27a, 0xbe32fddc, 0xbdcff609, 0xbeee4d18, 0xbe64bcea, 0xbe4c8cf5, 0x3e5e9d47, 0x3e4c4801, 0x3b73f16d, 0xbf026bb9, 0x3ca215d7, 0x3eb2fd77, 0x3df2402e, 0xbe435906, 0xbe833b51, 0x3e0e9472, 0x3dc33c3b, 0xbea9d69d, 0x3e9af7fe, 0xbd80b73c, 0x3d851780, 0x3e148a69, 0xbc5c6a36, 0xbd814f39, 0x3d64525e, 0x3d353cd4, 0xbd927ed4, 0xbe60729d, 0xbcaaafc3, 0xbec50c2f }; static const uint32_t in_cholesky_dpo[3111] = { 0x3e800000, 0x3f400000, 0x3e800000, 0x3e800000, 0x3f400000, 0x3f093e10, 0xbe40978e, 0x3e604745, 0xbe40978e, 0x3f1d0fd7, 0xbcfd7d2a, 0x3e604745, 0xbcfd7d2a, 0x3f59b210, 0x3f4ce2d1, 0x3f2696d4, 0x3efb1b51, 0x3f230ed3, 0x3f2696d4, 0x3f113c58, 0x3ed3bbe2, 0x3f00a97b, 0x3efb1b51, 0x3ed3bbe2, 0x3ed8ce65, 0x3e7dc8ed, 0x3f230ed3, 0x3f00a97b, 0x3e7dc8ed, 0x3f383b5f, 0x3fbee223, 0x3fc2aa20, 0x3fd35475, 0x3f45721d, 0x3f937f11, 0x3f81b85a, 0x3f1619b6, 0x3fc2aa20, 0x4017b563, 0x4009aefa, 0x3f92ff76, 0x3fa171dc, 0x3fd8a667, 0x3f90e11e, 0x3fd35475, 0x4009aefa, 0x4010e594, 0x3f75e5ee, 0x3fc0e7dc, 0x3fc1768e, 0x3f65dd02, 0x3f45721d, 0x3f92ff76, 0x3f75e5ee, 0x3f56a7c3, 0x3f090cc0, 0x3f52ddbd, 0x3f23fe84, 0x3f937f11, 0x3fa171dc, 0x3fc0e7dc, 0x3f090cc0, 0x3fac3f79, 0x3f2e97fe, 0x3ec4aaba, 0x3f81b85a, 0x3fd8a667, 0x3fc1768e, 0x3f52ddbd, 0x3f2e97fe, 0x3fb0f69b, 0x3f5b221a, 0x3f1619b6, 0x3f90e11e, 0x3f65dd02, 0x3f23fe84, 0x3ec4aaba, 0x3f5b221a, 0x3f2b0201, 0x3fc0a5c8, 0x3f9e6540, 0x3fd73c15, 0x3f4028ec, 0x3f89b9ed, 0x3f3366d1, 0x3f8b7093, 0x3f8855aa, 0x3f9e6540, 0x3fba3311, 0x3ff0b395, 0x3f73076a, 0x3f899d0a, 0x3f7e2a81, 0x3f9edeb9, 0x3f437be7, 0x3fd73c15, 0x3ff0b395, 0x4022be08, 0x3f9a1ed4, 0x3fb87ccf, 0x3f93d537, 0x3fd81d06, 0x3f847ecc, 0x3f4028ec, 0x3f73076a, 0x3f9a1ed4, 0x3f37bbdb, 0x3f33be98, 0x3f22a894, 0x3f4fce02, 0x3f01a1b6, 0x3f89b9ed, 0x3f899d0a, 0x3fb87ccf, 0x3f33be98, 0x3f9bf44d, 0x3f66d06d, 0x3f66d1a4, 0x3f3e90ad, 0x3f3366d1, 0x3f7e2a81, 0x3f93d537, 0x3f22a894, 0x3f66d06d, 0x3f87e915, 0x3f34a02e, 0x3ee08fb0, 0x3f8b7093, 0x3f9edeb9, 0x3fd81d06, 0x3f4fce02, 0x3f66d1a4, 0x3f34a02e, 0x3fa63eae, 0x3f29c5a0, 0x3f8855aa, 0x3f437be7, 0x3f847ecc, 0x3f01a1b6, 0x3f3e90ad, 0x3ee08fb0, 0x3f29c5a0, 0x3f808480, 0x3f7ae784, 0x3fa9bee8, 0x3f6b833d, 0x3fa613e6, 0x3f8444ed, 0x3f931e8f, 0x3f7720c9, 0x3fa2490b, 0x3f9e94bc, 0x3fa9bee8, 0x4017cda2, 0x3fcaaaf2, 0x4009c3dd, 0x3fcb75e7, 0x3ff30609, 0x3fcd140c, 0x4005f0a8, 0x400579ab, 0x3f6b833d, 0x3fcaaaf2, 0x3fa2dd66, 0x3fc11865, 0x3f8bc614, 0x3fa41b1a, 0x3f7f9767, 0x3fa0ddfa, 0x3fb1d3e4, 0x3fa613e6, 0x4009c3dd, 0x3fc11865, 0x401ca535, 0x3fcdffa3, 0x3fe0c0a1, 0x3fbcf79f, 0x3fdbe078, 0x40029261, 0x3f8444ed, 0x3fcb75e7, 0x3f8bc614, 0x3fcdffa3, 0x3faa70b4, 0x3f9506bf, 0x3f7caff6, 0x3fae9877, 0x3fb89a5f, 0x3f931e8f, 0x3ff30609, 0x3fa41b1a, 0x3fe0c0a1, 0x3f9506bf, 0x3fe96d4a, 0x3fa98cb4, 0x3fe2dfea, 0x3fd1de03, 0x3f7720c9, 0x3fcd140c, 0x3f7f9767, 0x3fbcf79f, 0x3f7caff6, 0x3fa98cb4, 0x3fd1118e, 0x3fc5a266, 0x3fbc76a3, 0x3fa2490b, 0x4005f0a8, 0x3fa0ddfa, 0x3fdbe078, 0x3fae9877, 0x3fe2dfea, 0x3fc5a266, 0x40087538, 0x3ff23352, 0x3f9e94bc, 0x400579ab, 0x3fb1d3e4, 0x40029261, 0x3fb89a5f, 0x3fd1de03, 0x3fbc76a3, 0x3ff23352, 0x400c1236, 0x403f4250, 0x3fcb8828, 0x4014e35f, 0x3fc4ad5c, 0x4012f791, 0x3fbcec14, 0x40138c51, 0x401a4ac8, 0x4049e29e, 0x3fe1e2df, 0x3fb31c52, 0x3ff5ffa5, 0x40157950, 0x4024476f, 0x3fd2261c, 0x3fcb8828, 0x3ff55f54, 0x3fc1f86a, 0x3f786cad, 0x3fd31c1c, 0x3fac5469, 0x3fe37839, 0x400ca656, 0x40221430, 0x3faa00ad, 0x3f920c4a, 0x3f898d79, 0x3fe8a71e, 0x3fb9f88f, 0x3f530b11, 0x4014e35f, 0x3fc1f86a, 0x4033d2f8, 0x3fee8dcd, 0x3fff9ef4, 0x3fd521f8, 0x40047641, 0x401d4d48, 0x402201dd, 0x3ff7852e, 0x3f960747, 0x4003576c, 0x4003e191, 0x3fe51df3, 0x3fdf3beb, 0x3fc4ad5c, 0x3f786cad, 0x3fee8dcd, 0x3fe65dff, 0x3fb1c6b8, 0x3f750370, 0x3fab608b, 0x3fe0eb66, 0x3fe3f401, 0x3fb36085, 0x3f81b002, 0x3fc80b00, 0x3fd770f1, 0x3f87b8f8, 0x3fc2bcdb, 0x4012f791, 0x3fd31c1c, 0x3fff9ef4, 0x3fb1c6b8, 0x402f5b74, 0x3fa14c20, 0x3ff69a3a, 0x402bf72b, 0x403042b3, 0x3fc2e9b8, 0x3fa55dc8, 0x3ff5bfda, 0x3ff451e9, 0x400b9827, 0x3f925ce8, 0x3fbcec14, 0x3fac5469, 0x3fd521f8, 0x3f750370, 0x3fa14c20, 0x3fd83a93, 0x3fa365cc, 0x3ff42b0d, 0x3ffa95cd, 0x3f9725b9, 0x3f489854, 0x3f8f65ee, 0x3fbe2de9, 0x3fc18774, 0x3f615bc9, 0x40138c51, 0x3fe37839, 0x40047641, 0x3fab608b, 0x3ff69a3a, 0x3fa365cc, 0x402641c1, 0x40162dbb, 0x40363300, 0x3fd816b6, 0x3fc0dd23, 0x3fded009, 0x4010bcf2, 0x3fe44076, 0x3faecbe6, 0x401a4ac8, 0x400ca656, 0x401d4d48, 0x3fe0eb66, 0x402bf72b, 0x3ff42b0d, 0x40162dbb, 0x40606066, 0x404f74f3, 0x40034fb8, 0x3fe141da, 0x400ecb12, 0x401b7af3, 0x40169832, 0x3fb8287f, 0x4049e29e, 0x40221430, 0x402201dd, 0x3fe3f401, 0x403042b3, 0x3ffa95cd, 0x40363300, 0x404f74f3, 0x408abb01, 0x40043b87, 0x3fecc13c, 0x400509ab, 0x403a6b27, 0x403c2252, 0x3ff49b0c, 0x3fe1e2df, 0x3faa00ad, 0x3ff7852e, 0x3fb36085, 0x3fc2e9b8, 0x3f9725b9, 0x3fd816b6, 0x40034fb8, 0x40043b87, 0x3ff3c242, 0x3fadb6b3, 0x3fc73591, 0x3fee39f8, 0x3fcb5f4f, 0x3fa8fff9, 0x3fb31c52, 0x3f920c4a, 0x3f960747, 0x3f81b002, 0x3fa55dc8, 0x3f489854, 0x3fc0dd23, 0x3fe141da, 0x3fecc13c, 0x3fadb6b3, 0x3fabd49b, 0x3f9c6696, 0x3fcafcfa, 0x3facdab5, 0x3f7d1928, 0x3ff5ffa5, 0x3f898d79, 0x4003576c, 0x3fc80b00, 0x3ff5bfda, 0x3f8f65ee, 0x3fded009, 0x400ecb12, 0x400509ab, 0x3fc73591, 0x3f9c6696, 0x400da878, 0x3fd68ba3, 0x3fd4737d, 0x3fb33737, 0x40157950, 0x3fe8a71e, 0x4003e191, 0x3fd770f1, 0x3ff451e9, 0x3fbe2de9, 0x4010bcf2, 0x401b7af3, 0x403a6b27, 0x3fee39f8, 0x3fcafcfa, 0x3fd68ba3, 0x402c4ef5, 0x3ff49edd, 0x3fc370c8, 0x4024476f, 0x3fb9f88f, 0x3fe51df3, 0x3f87b8f8, 0x400b9827, 0x3fc18774, 0x3fe44076, 0x40169832, 0x403c2252, 0x3fcb5f4f, 0x3facdab5, 0x3fd4737d, 0x3ff49edd, 0x403551d6, 0x3fa29685, 0x3fd2261c, 0x3f530b11, 0x3fdf3beb, 0x3fc2bcdb, 0x3f925ce8, 0x3f615bc9, 0x3faecbe6, 0x3fb8287f, 0x3ff49b0c, 0x3fa8fff9, 0x3f7d1928, 0x3fb33737, 0x3fc370c8, 0x3fa29685, 0x3fd1db53, 0x3d800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e000000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e400000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ea00000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ec00000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ee00000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f000000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f100000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f200000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f300000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f400000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f500000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f600000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f700000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x4019baae, 0x3ff2724f, 0x3fbc44f5, 0x3fee4f82, 0x3ffeba69, 0x40152e2a, 0x4009817d, 0x40022005, 0x3fe21e7a, 0x3f82bb64, 0x3fd52131, 0x3ff7197f, 0x3faf9724, 0x3ff7c4fa, 0x3fe20cd1, 0x3f788880, 0x40158655, 0x3ff2724f, 0x4031e199, 0x3fc93f77, 0x400ed11f, 0x3ff8a8bb, 0x40226b84, 0x400acbd5, 0x4029efe2, 0x401e2049, 0x3fc3a3f4, 0x4005b563, 0x400e9ee8, 0x3fc34ea0, 0x401e112f, 0x4014ae22, 0x3ff08925, 0x4027e7df, 0x3fbc44f5, 0x3fc93f77, 0x3fec26bf, 0x3fdeed7d, 0x3fcca2bc, 0x3ff09870, 0x3fed99cf, 0x3ffc2d53, 0x3fd54a82, 0x3f9234c9, 0x3fe1eaa5, 0x3fe47d1f, 0x3fae5ba9, 0x3feb9b5c, 0x3fce2ae0, 0x3f8cd4a0, 0x4001af3f, 0x3fee4f82, 0x400ed11f, 0x3fdeed7d, 0x405342cd, 0x4015c4db, 0x4023141c, 0x4021c34f, 0x4034f18c, 0x4044396c, 0x3ff25b8f, 0x40062989, 0x400e2ad5, 0x3fa6460f, 0x402a75e5, 0x400bbc18, 0x3ff66ff3, 0x403c49d5, 0x3ffeba69, 0x3ff8a8bb, 0x3fcca2bc, 0x4015c4db, 0x401b2448, 0x400d7c82, 0x401ad42f, 0x4015f99b, 0x4017b461, 0x3faf2ed7, 0x3fd4e4c2, 0x3ff94ca5, 0x3fbcfaa5, 0x4013181a, 0x40140142, 0x3fbc8529, 0x4024e117, 0x40152e2a, 0x40226b84, 0x3ff09870, 0x4023141c, 0x400d7c82, 0x404d9397, 0x40209dee, 0x401f0451, 0x40179e20, 0x3fcf6f79, 0x40006667, 0x401d336a, 0x3fcb514c, 0x401ab697, 0x400985f5, 0x3fc9e40a, 0x403dd429, 0x4009817d, 0x400acbd5, 0x3fed99cf, 0x4021c34f, 0x401ad42f, 0x40209dee, 0x4049b2d5, 0x40128e03, 0x402219b9, 0x3fcfff27, 0x401c30ae, 0x40213102, 0x3fca9fbc, 0x402cfcdc, 0x40106cc3, 0x3fafb79f, 0x4030ec8c, 0x40022005, 0x4029efe2, 0x3ffc2d53, 0x4034f18c, 0x4015f99b, 0x401f0451, 0x40128e03, 0x40685595, 0x404722a5, 0x3fdbfe2f, 0x40201251, 0x40127f34, 0x3fe16bf2, 0x404acc90, 0x403b67da, 0x400a9d14, 0x404b16b9, 0x3fe21e7a, 0x401e2049, 0x3fd54a82, 0x4044396c, 0x4017b461, 0x40179e20, 0x402219b9, 0x404722a5, 0x405c1924, 0x3fd6509f, 0x400b76b3, 0x400524b9, 0x3fa922bf, 0x403bdcb1, 0x40227a91, 0x3ff7a006, 0x4042e728, 0x3f82bb64, 0x3fc3a3f4, 0x3f9234c9, 0x3ff25b8f, 0x3faf2ed7, 0x3fcf6f79, 0x3fcfff27, 0x3fdbfe2f, 0x3fd6509f, 0x3fdd0850, 0x3fc3f8f9, 0x3fd62780, 0x3f844a75, 0x3feb9131, 0x3fb769be, 0x3fc94781, 0x3fd0a6f6, 0x3fd52131, 0x4005b563, 0x3fe1eaa5, 0x40062989, 0x3fd4e4c2, 0x40006667, 0x401c30ae, 0x40201251, 0x400b76b3, 0x3fc3f8f9, 0x4044efba, 0x401a61c8, 0x3fca79c3, 0x40327c7b, 0x4011a2b1, 0x3fb94907, 0x401743d6, 0x3ff7197f, 0x400e9ee8, 0x3fe47d1f, 0x400e2ad5, 0x3ff94ca5, 0x401d336a, 0x40213102, 0x40127f34, 0x400524b9, 0x3fd62780, 0x401a61c8, 0x4047b84b, 0x3fbccd13, 0x40138713, 0x4006217f, 0x3fc3c2ad, 0x4035d9de, 0x3faf9724, 0x3fc34ea0, 0x3fae5ba9, 0x3fa6460f, 0x3fbcfaa5, 0x3fcb514c, 0x3fca9fbc, 0x3fe16bf2, 0x3fa922bf, 0x3f844a75, 0x3fca79c3, 0x3fbccd13, 0x3fc43ad3, 0x3fe6e3d1, 0x3fe0988c, 0x3f8cbbc7, 0x3fd85ed1, 0x3ff7c4fa, 0x401e112f, 0x3feb9b5c, 0x402a75e5, 0x4013181a, 0x401ab697, 0x402cfcdc, 0x404acc90, 0x403bdcb1, 0x3feb9131, 0x40327c7b, 0x40138713, 0x3fe6e3d1, 0x4061816d, 0x402f3cc8, 0x4002fee8, 0x403abf6b, 0x3fe20cd1, 0x4014ae22, 0x3fce2ae0, 0x400bbc18, 0x40140142, 0x400985f5, 0x40106cc3, 0x403b67da, 0x40227a91, 0x3fb769be, 0x4011a2b1, 0x4006217f, 0x3fe0988c, 0x402f3cc8, 0x404abd53, 0x3fe99436, 0x402ef506, 0x3f788880, 0x3ff08925, 0x3f8cd4a0, 0x3ff66ff3, 0x3fbc8529, 0x3fc9e40a, 0x3fafb79f, 0x400a9d14, 0x3ff7a006, 0x3fc94781, 0x3fb94907, 0x3fc3c2ad, 0x3f8cbbc7, 0x4002fee8, 0x3fe99436, 0x400de31c, 0x3fe4c8ba, 0x40158655, 0x4027e7df, 0x4001af3f, 0x403c49d5, 0x4024e117, 0x403dd429, 0x4030ec8c, 0x404b16b9, 0x4042e728, 0x3fd0a6f6, 0x401743d6, 0x4035d9de, 0x3fd85ed1, 0x403abf6b, 0x402ef506, 0x3fe4c8ba, 0x40653bcc, 0x407da181, 0x4050841b, 0x408195cf, 0x405d6b98, 0x4026f5bb, 0x405d4bf9, 0x404e0a46, 0x40179a34, 0x4026f790, 0x403be744, 0x405bd3af, 0x4056554c, 0x404f2358, 0x40590322, 0x40266d6d, 0x405e9596, 0x407c6c9f, 0x402c2e84, 0x402d0f0d, 0x40831eda, 0x402c1f18, 0x404b3f08, 0x40322d34, 0x40521070, 0x406583c8, 0x40509958, 0x4036ce36, 0x40380cf5, 0x40647783, 0x40449969, 0x40374a9c, 0x405fb35a, 0x4050841b, 0x40a0c1cf, 0x40973295, 0x40897894, 0x40421a15, 0x408c2722, 0x40910355, 0x4005276c, 0x4084b318, 0x40361277, 0x40898e1a, 0x4064569a, 0x4078c17b, 0x40858252, 0x4044f47b, 0x407334cf, 0x40987786, 0x4059df87, 0x40832db1, 0x407f948e, 0x404f2da4, 0x4058eec5, 0x402d7e42, 0x406e03a7, 0x409aa7d7, 0x40816708, 0x4068c4f8, 0x40447376, 0x407908e7, 0x4080161e, 0x406bf23a, 0x408d77e0, 0x408195cf, 0x40973295, 0x40e917ff, 0x40a6dd86, 0x4078d484, 0x40b81f2e, 0x40b4253f, 0x404b88c5, 0x4084e372, 0x4081292b, 0x40a8278b, 0x40b10867, 0x4094eeda, 0x409aecc1, 0x4088921a, 0x40a20f90, 0x40b9332c, 0x4081fa05, 0x4091fb60, 0x40aad25c, 0x40943934, 0x40818aaf, 0x4082648b, 0x4081c844, 0x40d18680, 0x40a1ee48, 0x4085133b, 0x4085bf8c, 0x40ac7c7f, 0x40a3806b, 0x408f3ea3, 0x40b009b5, 0x405d6b98, 0x40897894, 0x40a6dd86, 0x40b82bb9, 0x4051e10a, 0x40903a8f, 0x409703c4, 0x402e77c6, 0x407704bd, 0x4081a03a, 0x40897e3e, 0x408ef24c, 0x4073b58a, 0x40879381, 0x4045d3a6, 0x4094824b, 0x40986a15, 0x405bd30f, 0x407d962e, 0x409e2074, 0x406499d2, 0x4085e399, 0x40502b8f, 0x408c03eb, 0x40a0a0bf, 0x408a8121, 0x406590f5, 0x407325f9, 0x408fdd13, 0x4084482d, 0x40759f58, 0x4094b7ea, 0x4026f5bb, 0x40421a15, 0x4078d484, 0x4051e10a, 0x408160f9, 0x4083d01a, 0x407666d2, 0x40385d46, 0x40416ab2, 0x404d9b46, 0x40370784, 0x4056b7ce, 0x404d8811, 0x4055dcb6, 0x404007f4, 0x403c5c1d, 0x4065a213, 0x40162855, 0x406f7ac3, 0x4065376c, 0x403e8db3, 0x4044b9ff, 0x4029745e, 0x404bd1e7, 0x4087c856, 0x4073bf49, 0x40431895, 0x404bc77a, 0x403ed7c4, 0x40842a1b, 0x40577bb3, 0x4086b720, 0x405d4bf9, 0x408c2722, 0x40b81f2e, 0x40903a8f, 0x4083d01a, 0x40d17cfb, 0x40b029e8, 0x406c11bf, 0x40896473, 0x409dfec5, 0x4094c9cf, 0x40a533bd, 0x408a4758, 0x409b896f, 0x40854ec6, 0x40904287, 0x40a0068c, 0x4076a54f, 0x4095cc78, 0x40a69015, 0x4094fe7f, 0x4070dff2, 0x406dfecd, 0x408d3d7c, 0x40bf1dab, 0x409bdee9, 0x4083022d, 0x4088353f, 0x409df06c, 0x40a62e02, 0x40913cb3, 0x40aef2fe, 0x404e0a46, 0x40910355, 0x40b4253f, 0x409703c4, 0x407666d2, 0x40b029e8, 0x40c75639, 0x404a5d36, 0x4088b9bd, 0x4086e554, 0x4097e846, 0x408d29f6, 0x408c9caf, 0x409c0b07, 0x408cb4ff, 0x40961833, 0x409f9687, 0x4077cf0f, 0x40a030a2, 0x40a456c1, 0x408dca66, 0x40890810, 0x405fe05f, 0x4094d71e, 0x40c325c9, 0x409ce270, 0x40801189, 0x4085c7fb, 0x4091050e, 0x40a64c49, 0x408d75de, 0x40a7ac6c, 0x40179a34, 0x4005276c, 0x404b88c5, 0x402e77c6, 0x40385d46, 0x406c11bf, 0x404a5d36, 0x4066805c, 0x4003f2bb, 0x404b5b02, 0x4028e041, 0x4054dd21, 0x403aaa40, 0x405a8a97, 0x403fb677, 0x40475399, 0x40372693, 0x401c6bb8, 0x40362868, 0x406806f9, 0x401b1021, 0x40338499, 0x40290f85, 0x40427178, 0x406d0221, 0x40458523, 0x402f893d, 0x40412d5c, 0x40491167, 0x405dceda, 0x40361b4e, 0x40486197, 0x4026f790, 0x4084b318, 0x4084e372, 0x407704bd, 0x40416ab2, 0x40896473, 0x4088b9bd, 0x4003f2bb, 0x409757e5, 0x40416a34, 0x4080d090, 0x40452100, 0x40686800, 0x4060ae3f, 0x402a389f, 0x405b219c, 0x408423aa, 0x403eda7b, 0x407edd3c, 0x40638ab9, 0x404ee2c2, 0x40445d2d, 0x402911d1, 0x40640e52, 0x4093e6ce, 0x4080ee82, 0x406ab146, 0x4041184f, 0x405dcb0f, 0x4070750c, 0x40730809, 0x408dbe53, 0x403be744, 0x40361277, 0x4081292b, 0x4081a03a, 0x404d9b46, 0x409dfec5, 0x4086e554, 0x404b5b02, 0x40416a34, 0x40b03b66, 0x4066ed9a, 0x408c1172, 0x40414aad, 0x40620fc6, 0x40583929, 0x4069276a, 0x40622511, 0x402a470b, 0x404c07d6, 0x40978317, 0x4063bf56, 0x4057b479, 0x40473b28, 0x40854e31, 0x40836ebe, 0x40596d36, 0x4041a0be, 0x407483d4, 0x4083c846, 0x40786125, 0x40547192, 0x409160e8, 0x405bd3af, 0x40898e1a, 0x40a8278b, 0x40897e3e, 0x40370784, 0x4094c9cf, 0x4097e846, 0x4028e041, 0x4080d090, 0x4066ed9a, 0x40afa7b6, 0x408a4afc, 0x40818bac, 0x40887f56, 0x4061088b, 0x4084025a, 0x409b12fe, 0x406912d2, 0x407c1b62, 0x408b8dd6, 0x4055037c, 0x40563822, 0x4050f9a8, 0x406f8fef, 0x409f66be, 0x4083a2c4, 0x406d7587, 0x405984d7, 0x40929f79, 0x408457e6, 0x405f34a0, 0x408a1b89, 0x4056554c, 0x4064569a, 0x40b10867, 0x408ef24c, 0x4056b7ce, 0x40a533bd, 0x408d29f6, 0x4054dd21, 0x40452100, 0x408c1172, 0x408a4afc, 0x40b9f96d, 0x4087eff8, 0x40944a9f, 0x40705784, 0x40877273, 0x408dfe8d, 0x40626399, 0x40703242, 0x40a374b1, 0x406d0994, 0x4059b6e8, 0x406dde1e, 0x405e8f02, 0x40a8ad58, 0x407ac986, 0x40647f58, 0x40697ead, 0x409a9fe3, 0x408fe013, 0x405807dc, 0x4092fc8f, 0x404f2358, 0x4078c17b, 0x4094eeda, 0x4073b58a, 0x404d8811, 0x408a4758, 0x408c9caf, 0x403aaa40, 0x40686800, 0x40414aad, 0x40818bac, 0x4087eff8, 0x40999f77, 0x4098d1a9, 0x4064548f, 0x407bd42a, 0x408d7cb9, 0x40709ec3, 0x40803b05, 0x4082944b, 0x403b8794, 0x40639441, 0x4053a43b, 0x405407c4, 0x40a3558c, 0x408abcbf, 0x4079a023, 0x4046635c, 0x408748e1, 0x408d17fd, 0x40563f60, 0x40847b6d, 0x40590322, 0x40858252, 0x409aecc1, 0x40879381, 0x4055dcb6, 0x409b896f, 0x409c0b07, 0x405a8a97, 0x4060ae3f, 0x40620fc6, 0x40887f56, 0x40944a9f, 0x4098d1a9, 0x40ca1da5, 0x408b8b26, 0x408f2237, 0x409935b1, 0x408f5e44, 0x408b3c74, 0x409e9d7b, 0x405207ab, 0x40821146, 0x405da263, 0x4082a002, 0x40ae9d4c, 0x408d9a50, 0x4086a11b, 0x40697ceb, 0x409869ff, 0x4092f4d1, 0x406d5708, 0x409cad45, 0x40266d6d, 0x4044f47b, 0x4088921a, 0x4045d3a6, 0x404007f4, 0x40854ec6, 0x408cb4ff, 0x403fb677, 0x402a389f, 0x40583929, 0x4061088b, 0x40705784, 0x4064548f, 0x408b8b26, 0x409026c5, 0x4071d511, 0x40606b73, 0x404d21ef, 0x40519a6b, 0x40876da4, 0x4038a99a, 0x40530f19, 0x403f57ae, 0x405091c6, 0x40933db7, 0x404db756, 0x406070f8, 0x404a8f88, 0x4076e4b0, 0x408d70fa, 0x404e6491, 0x408750d2, 0x405e9596, 0x407334cf, 0x40a20f90, 0x4094824b, 0x403c5c1d, 0x40904287, 0x40961833, 0x40475399, 0x405b219c, 0x4069276a, 0x4084025a, 0x40877273, 0x407bd42a, 0x408f2237, 0x4071d511, 0x40a52461, 0x40967e0c, 0x4065e511, 0x40675c2e, 0x409f2ec0, 0x40661153, 0x40821f97, 0x4061afa4, 0x4080438e, 0x40a50803, 0x407a3e40, 0x406f3a34, 0x40658e45, 0x4096dcab, 0x408b931c, 0x408326bf, 0x408a871b, 0x407c6c9f, 0x40987786, 0x40b9332c, 0x40986a15, 0x4065a213, 0x40a0068c, 0x409f9687, 0x40372693, 0x408423aa, 0x40622511, 0x409b12fe, 0x408dfe8d, 0x408d7cb9, 0x409935b1, 0x40606b73, 0x40967e0c, 0x40c9031e, 0x406c8611, 0x408a5bb7, 0x4092a286, 0x406ccc09, 0x408c7a69, 0x405fc449, 0x4080a435, 0x40b3984d, 0x409d43fd, 0x4076435f, 0x405883b5, 0x409a2a33, 0x408d49dd, 0x408c16da, 0x4098a267, 0x402c2e84, 0x4059df87, 0x4081fa05, 0x405bd30f, 0x40162855, 0x4076a54f, 0x4077cf0f, 0x401c6bb8, 0x403eda7b, 0x402a470b, 0x406912d2, 0x40626399, 0x40709ec3, 0x408f5e44, 0x404d21ef, 0x4065e511, 0x406c8611, 0x4082c7d6, 0x406a7a94, 0x4073068c, 0x40273155, 0x4050b39b, 0x4020affe, 0x40497101, 0x40903eef, 0x407ed46e, 0x4063139c, 0x40364e2b, 0x405bd2a3, 0x405e8c7c, 0x403275fe, 0x405dd760, 0x402d0f0d, 0x40832db1, 0x4091fb60, 0x407d962e, 0x406f7ac3, 0x4095cc78, 0x40a030a2, 0x40362868, 0x407edd3c, 0x404c07d6, 0x407c1b62, 0x40703242, 0x40803b05, 0x408b3c74, 0x40519a6b, 0x40675c2e, 0x408a5bb7, 0x406a7a94, 0x40af4de2, 0x408665da, 0x40675331, 0x4066f91e, 0x402cd247, 0x407135ff, 0x40b0912c, 0x4099f2b1, 0x406f567f, 0x4056c1f4, 0x40478add, 0x408dd8a7, 0x406722fd, 0x408e87c2, 0x40831eda, 0x407f948e, 0x40aad25c, 0x409e2074, 0x4065376c, 0x40a69015, 0x40a456c1, 0x406806f9, 0x40638ab9, 0x40978317, 0x408b8dd6, 0x40a374b1, 0x4082944b, 0x409e9d7b, 0x40876da4, 0x409f2ec0, 0x4092a286, 0x4073068c, 0x408665da, 0x40cc8458, 0x408695ce, 0x408b0ea9, 0x4079db5d, 0x4094302e, 0x40ac1905, 0x40818e1d, 0x407f128e, 0x4086085a, 0x4099622a, 0x4099c657, 0x40848dad, 0x409fe82d, 0x402c1f18, 0x404f2da4, 0x40943934, 0x406499d2, 0x403e8db3, 0x4094fe7f, 0x408dca66, 0x401b1021, 0x404ee2c2, 0x4063bf56, 0x4055037c, 0x406d0994, 0x403b8794, 0x405207ab, 0x4038a99a, 0x40661153, 0x406ccc09, 0x40273155, 0x40675331, 0x408695ce, 0x408ec53e, 0x4031349b, 0x40333f7c, 0x406030db, 0x409686b4, 0x40566397, 0x40359c44, 0x4067b21a, 0x4066bf7f, 0x406c0f66, 0x407542ee, 0x40879465, 0x404b3f08, 0x4058eec5, 0x40818aaf, 0x4085e399, 0x4044b9ff, 0x4070dff2, 0x40890810, 0x40338499, 0x40445d2d, 0x4057b479, 0x40563822, 0x4059b6e8, 0x40639441, 0x40821146, 0x40530f19, 0x40821f97, 0x408c7a69, 0x4050b39b, 0x4066f91e, 0x408b0ea9, 0x4031349b, 0x4098ead6, 0x402e6aeb, 0x4084793c, 0x408b798c, 0x408ac3f3, 0x405da858, 0x404f907e, 0x4066568c, 0x406a001b, 0x405d818c, 0x40806a03, 0x40322d34, 0x402d7e42, 0x4082648b, 0x40502b8f, 0x4029745e, 0x406dfecd, 0x405fe05f, 0x40290f85, 0x402911d1, 0x40473b28, 0x4050f9a8, 0x406dde1e, 0x4053a43b, 0x405da263, 0x403f57ae, 0x4061afa4, 0x405fc449, 0x4020affe, 0x402cd247, 0x4079db5d, 0x40333f7c, 0x402e6aeb, 0x405bfeee, 0x402e2e59, 0x4078ed42, 0x4033696f, 0x402e1b27, 0x40347b78, 0x407c1914, 0x40679dce, 0x40408c5d, 0x4060f106, 0x40521070, 0x406e03a7, 0x4081c844, 0x408c03eb, 0x404bd1e7, 0x408d3d7c, 0x4094d71e, 0x40427178, 0x40640e52, 0x40854e31, 0x406f8fef, 0x405e8f02, 0x405407c4, 0x4082a002, 0x405091c6, 0x4080438e, 0x4080a435, 0x40497101, 0x407135ff, 0x4094302e, 0x406030db, 0x4084793c, 0x402e2e59, 0x40a03aea, 0x4092cace, 0x40897525, 0x405b6c20, 0x4081c8fb, 0x4073e285, 0x406ad834, 0x4074b9a4, 0x4094acfa, 0x406583c8, 0x409aa7d7, 0x40d18680, 0x40a0a0bf, 0x4087c856, 0x40bf1dab, 0x40c325c9, 0x406d0221, 0x4093e6ce, 0x40836ebe, 0x409f66be, 0x40a8ad58, 0x40a3558c, 0x40ae9d4c, 0x40933db7, 0x40a50803, 0x40b3984d, 0x40903eef, 0x40b0912c, 0x40ac1905, 0x409686b4, 0x408b798c, 0x4078ed42, 0x4092cace, 0x40eefb8e, 0x40b92eac, 0x4092b2cc, 0x408ee595, 0x40a2426d, 0x40b66be2, 0x409b9a48, 0x40ba89a7, 0x40509958, 0x40816708, 0x40a1ee48, 0x408a8121, 0x4073bf49, 0x409bdee9, 0x409ce270, 0x40458523, 0x4080ee82, 0x40596d36, 0x4083a2c4, 0x407ac986, 0x408abcbf, 0x408d9a50, 0x404db756, 0x407a3e40, 0x409d43fd, 0x407ed46e, 0x4099f2b1, 0x40818e1d, 0x40566397, 0x408ac3f3, 0x4033696f, 0x40897525, 0x40b92eac, 0x40bf1144, 0x40773b3c, 0x406c163b, 0x4073fe06, 0x40887186, 0x4072cabe, 0x409220ea, 0x4036ce36, 0x4068c4f8, 0x4085133b, 0x406590f5, 0x40431895, 0x4083022d, 0x40801189, 0x402f893d, 0x406ab146, 0x4041a0be, 0x406d7587, 0x40647f58, 0x4079a023, 0x4086a11b, 0x406070f8, 0x406f3a34, 0x4076435f, 0x4063139c, 0x406f567f, 0x407f128e, 0x40359c44, 0x405da858, 0x402e1b27, 0x405b6c20, 0x4092b2cc, 0x40773b3c, 0x4087467f, 0x403e06f9, 0x405ab142, 0x40826ba8, 0x405a004c, 0x4083b62d, 0x40380cf5, 0x40447376, 0x4085bf8c, 0x407325f9, 0x404bc77a, 0x4088353f, 0x4085c7fb, 0x40412d5c, 0x4041184f, 0x407483d4, 0x405984d7, 0x40697ead, 0x4046635c, 0x40697ceb, 0x404a8f88, 0x40658e45, 0x405883b5, 0x40364e2b, 0x4056c1f4, 0x4086085a, 0x4067b21a, 0x404f907e, 0x40347b78, 0x4081c8fb, 0x408ee595, 0x406c163b, 0x403e06f9, 0x4084daa8, 0x4070f3df, 0x40680d2c, 0x4063146f, 0x408c090b, 0x40647783, 0x407908e7, 0x40ac7c7f, 0x408fdd13, 0x403ed7c4, 0x409df06c, 0x4091050e, 0x40491167, 0x405dcb0f, 0x4083c846, 0x40929f79, 0x409a9fe3, 0x408748e1, 0x409869ff, 0x4076e4b0, 0x4096dcab, 0x409a2a33, 0x405bd2a3, 0x40478add, 0x4099622a, 0x4066bf7f, 0x4066568c, 0x407c1914, 0x4073e285, 0x40a2426d, 0x4073fe06, 0x405ab142, 0x4070f3df, 0x40ba6bf0, 0x408b0ab8, 0x407a4dc7, 0x40958005, 0x40449969, 0x4080161e, 0x40a3806b, 0x4084482d, 0x40842a1b, 0x40a62e02, 0x40a64c49, 0x405dceda, 0x4070750c, 0x40786125, 0x408457e6, 0x408fe013, 0x408d17fd, 0x4092f4d1, 0x408d70fa, 0x408b931c, 0x408d49dd, 0x405e8c7c, 0x408dd8a7, 0x4099c657, 0x406c0f66, 0x406a001b, 0x40679dce, 0x406ad834, 0x40b66be2, 0x40887186, 0x40826ba8, 0x40680d2c, 0x408b0ab8, 0x40b66a08, 0x40818e76, 0x409a30b4, 0x40374a9c, 0x406bf23a, 0x408f3ea3, 0x40759f58, 0x40577bb3, 0x40913cb3, 0x408d75de, 0x40361b4e, 0x40730809, 0x40547192, 0x405f34a0, 0x405807dc, 0x40563f60, 0x406d5708, 0x404e6491, 0x408326bf, 0x408c16da, 0x403275fe, 0x406722fd, 0x40848dad, 0x407542ee, 0x405d818c, 0x40408c5d, 0x4074b9a4, 0x409b9a48, 0x4072cabe, 0x405a004c, 0x4063146f, 0x407a4dc7, 0x40818e76, 0x408e8097, 0x409008ec, 0x405fb35a, 0x408d77e0, 0x40b009b5, 0x4094b7ea, 0x4086b720, 0x40aef2fe, 0x40a7ac6c, 0x40486197, 0x408dbe53, 0x409160e8, 0x408a1b89, 0x4092fc8f, 0x40847b6d, 0x409cad45, 0x408750d2, 0x408a871b, 0x4098a267, 0x405dd760, 0x408e87c2, 0x409fe82d, 0x40879465, 0x40806a03, 0x4060f106, 0x4094acfa, 0x40ba89a7, 0x409220ea, 0x4083b62d, 0x408c090b, 0x40958005, 0x409a30b4, 0x409008ec, 0x40cebce1, 0x40bb02f0, 0x40a20cfc, 0x40834d8b, 0x40821dfd, 0x406c9c37, 0x409c7642, 0x407e2afc, 0x40901520, 0x406fbf14, 0x40a2a289, 0x407fccba, 0x4083d632, 0x40b3b67a, 0x405607c5, 0x40976d5e, 0x409746da, 0x40848ec8, 0x4061b7ea, 0x4086f3ee, 0x40a06f6b, 0x4076420b, 0x401ed0a6, 0x40672930, 0x409ef8d4, 0x40941030, 0x4085d278, 0x409f05a3, 0x4099972a, 0x407471e3, 0x407f53ed, 0x409b1c72, 0x408b9b5a, 0x4085bdd0, 0x40a20cfc, 0x40f596db, 0x408a02c9, 0x4098b3a4, 0x407bd7b8, 0x40aa68e8, 0x4090a1fc, 0x409fead8, 0x4088618e, 0x40bf792b, 0x407c5781, 0x4090271a, 0x40d0d62b, 0x405024bb, 0x40aafe8b, 0x40b4ee95, 0x40867bf2, 0x408c7074, 0x409a9681, 0x40c16d98, 0x40984e50, 0x407f528d, 0x408a929f, 0x40a8d327, 0x40aee41b, 0x40af7bdb, 0x40ab0ecd, 0x40be6bb7, 0x408ddef9, 0x40a0e3dc, 0x40a0681f, 0x408e1cb7, 0x4087dc7c, 0x40834d8b, 0x408a02c9, 0x40920483, 0x40773cba, 0x4052cae2, 0x40915a4f, 0x405b8145, 0x40844be5, 0x4055ad8c, 0x408b1237, 0x406909f5, 0x4041f17d, 0x4096d746, 0x402e8c87, 0x408ba383, 0x408749c9, 0x4052dd72, 0x40627f4b, 0x405b22f2, 0x409059ac, 0x40569505, 0x40230703, 0x40426c3b, 0x4076d513, 0x4086135d, 0x407d2f81, 0x406a673a, 0x40949883, 0x405c4de1, 0x407457fa, 0x4082fa66, 0x404f0bc6, 0x4072c850, 0x40821dfd, 0x4098b3a4, 0x40773cba, 0x40999e1c, 0x404ee67c, 0x408ad84a, 0x40524bb3, 0x4091d275, 0x40675b3f, 0x409b3a8d, 0x4064ab8b, 0x404f6984, 0x40a71f2e, 0x402f385f, 0x4094a17c, 0x40999fb6, 0x4068131c, 0x405e8dea, 0x405741dc, 0x409ca25f, 0x40696321, 0x4032f440, 0x40523127, 0x40831644, 0x4090eb06, 0x4081694a, 0x4065dee9, 0x40a45210, 0x4066392b, 0x406d7190, 0x408e84be, 0x40709d6b, 0x4081ecd4, 0x406c9c37, 0x407bd7b8, 0x4052cae2, 0x404ee67c, 0x408b063f, 0x40927373, 0x4065022c, 0x4080d6df, 0x4060aba5, 0x408a0fe0, 0x4086743b, 0x40536743, 0x408b9bbf, 0x4047091a, 0x407c498e, 0x4079ceef, 0x404acf86, 0x403ed14c, 0x406a518e, 0x407bacc4, 0x405ebd33, 0x4028ac4e, 0x407351cb, 0x406db56a, 0x40841b92, 0x408c70c9, 0x4071aea8, 0x408c6d4d, 0x4063c485, 0x40664f27, 0x407d5160, 0x40723833, 0x40550ca7, 0x409c7642, 0x40aa68e8, 0x40915a4f, 0x408ad84a, 0x40927373, 0x40ce0fcf, 0x40800140, 0x40a0625a, 0x4081a3c6, 0x40b37873, 0x409dcf6a, 0x4076dfd1, 0x40c2bf64, 0x406e0f22, 0x40ab9b08, 0x40a4f412, 0x40740abe, 0x407612c3, 0x408e32df, 0x40aebf3d, 0x4085d90f, 0x40645c15, 0x4092006a, 0x409bf207, 0x409c124c, 0x40a6c9e2, 0x40918c85, 0x40acc145, 0x40979153, 0x4093c2ee, 0x40a2b1d5, 0x40981f7d, 0x4092daff, 0x407e2afc, 0x4090a1fc, 0x405b8145, 0x40524bb3, 0x4065022c, 0x40800140, 0x4095f343, 0x408c3a3d, 0x406c07ce, 0x409e3572, 0x4073d4a6, 0x407a0b52, 0x409e1926, 0x4041bc20, 0x407c7737, 0x406c2202, 0x406d41db, 0x407e4d0f, 0x406f9a92, 0x4095fffe, 0x4079179a, 0x402a9ca0, 0x4061df7c, 0x40838a55, 0x40876918, 0x408c655d, 0x4086c57d, 0x40939eee, 0x404e9c03, 0x4080aca0, 0x4071eb5f, 0x405da317, 0x405765e7, 0x40901520, 0x409fead8, 0x40844be5, 0x4091d275, 0x4080d6df, 0x40a0625a, 0x408c3a3d, 0x40cb432e, 0x40836574, 0x40b3d13c, 0x40a3e636, 0x4080781d, 0x40c5ba91, 0x406ada81, 0x409b6cc7, 0x409e3ddc, 0x4088d4c4, 0x409103e9, 0x408da8c5, 0x40aec80b, 0x40844a86, 0x40670471, 0x408956b6, 0x40a26f5f, 0x409be06c, 0x40999873, 0x409224ed, 0x40b8ab87, 0x40881149, 0x40948fc9, 0x40ace0fb, 0x408790ea, 0x40906964, 0x406fbf14, 0x4088618e, 0x4055ad8c, 0x40675b3f, 0x4060aba5, 0x4081a3c6, 0x406c07ce, 0x40836574, 0x409da1d1, 0x409cd562, 0x40656f75, 0x4064b707, 0x40991339, 0x40441cfa, 0x40856e97, 0x40972bb7, 0x4083c98f, 0x40524ec7, 0x4071c120, 0x409a90d7, 0x40616b7f, 0x4043ac13, 0x4088922b, 0x4091ce21, 0x409ddd17, 0x4075085e, 0x4078916a, 0x409e9a62, 0x402b581d, 0x4061eaad, 0x406a9e68, 0x407a998c, 0x4068c4eb, 0x40a2a289, 0x40bf792b, 0x408b1237, 0x409b3a8d, 0x408a0fe0, 0x40b37873, 0x409e3572, 0x40b3d13c, 0x409cd562, 0x40efeb7a, 0x40953095, 0x408d95a0, 0x40d470e4, 0x407cc431, 0x40a95b90, 0x40b82e6d, 0x4090bf35, 0x408e1a4b, 0x4093ab2f, 0x40c91399, 0x409df8f2, 0x406ad4cf, 0x409e9d06, 0x40b5364f, 0x40bdf9c3, 0x40ad686d, 0x40ae34f8, 0x40c119dd, 0x4088a140, 0x40a0d5bc, 0x409ea090, 0x409e8c2c, 0x408c0a69, 0x407fccba, 0x407c5781, 0x406909f5, 0x4064ab8b, 0x4086743b, 0x409dcf6a, 0x4073d4a6, 0x40a3e636, 0x40656f75, 0x40953095, 0x40ae9c2d, 0x405ad978, 0x40a89bc8, 0x40736707, 0x40865976, 0x408a05bf, 0x406d3f98, 0x407a47c3, 0x407abcc4, 0x408bd2a3, 0x4071dfa6, 0x4055fc51, 0x408631dc, 0x408b91ff, 0x408450ef, 0x40990fc2, 0x40833259, 0x409c17ab, 0x40789a31, 0x408a774e, 0x40984c2e, 0x40891f41, 0x4087ec89, 0x4083d632, 0x4090271a, 0x4041f17d, 0x404f6984, 0x40536743, 0x4076dfd1, 0x407a0b52, 0x4080781d, 0x4064b707, 0x408d95a0, 0x405ad978, 0x40887466, 0x40972907, 0x4041af23, 0x406a55bb, 0x407d7eed, 0x4064b7cb, 0x4047b166, 0x40698231, 0x4082704e, 0x406256a6, 0x402bb9ee, 0x4055b62b, 0x40848219, 0x40829418, 0x40701908, 0x4080de4e, 0x4088a2c3, 0x404878f8, 0x40674d78, 0x4076e17c, 0x4055a912, 0x40550c9c, 0x40b3b67a, 0x40d0d62b, 0x4096d746, 0x40a71f2e, 0x408b9bbf, 0x40c2bf64, 0x409e1926, 0x40c5ba91, 0x40991339, 0x40d470e4, 0x40a89bc8, 0x40972907, 0x40f1a29b, 0x4085dd69, 0x40b7d2cb, 0x40bfe83c, 0x409b7d89, 0x409fdc1b, 0x40a35c0f, 0x40cd9831, 0x40a4a9e7, 0x4086b197, 0x409d8141, 0x40bca904, 0x40b68f09, 0x40b4beab, 0x40a7b55a, 0x40d55a4f, 0x409c877b, 0x40ac4a90, 0x40c12c9c, 0x40a489ee, 0x409e41ca, 0x405607c5, 0x405024bb, 0x402e8c87, 0x402f385f, 0x4047091a, 0x406e0f22, 0x4041bc20, 0x406ada81, 0x40441cfa, 0x407cc431, 0x40736707, 0x4041af23, 0x4085dd69, 0x40682769, 0x4041b65e, 0x405a48fe, 0x40357362, 0x40273406, 0x4038a311, 0x4054a7b1, 0x403a6b29, 0x4028de98, 0x404de4d9, 0x40635991, 0x4068c117, 0x4062a5a1, 0x4043f665, 0x4078db90, 0x40281330, 0x40507c7c, 0x406d3edd, 0x406189ad, 0x403f7bb0, 0x40976d5e, 0x40aafe8b, 0x408ba383, 0x4094a17c, 0x407c498e, 0x40ab9b08, 0x407c7737, 0x409b6cc7, 0x40856e97, 0x40a95b90, 0x40865976, 0x406a55bb, 0x40b7d2cb, 0x4041b65e, 0x40bb0332, 0x40a05ebb, 0x406f7acb, 0x4084b8f3, 0x408a8bd6, 0x40acbece, 0x40716b2f, 0x405c087d, 0x4086760e, 0x4096e68e, 0x409ae87f, 0x4096c1b3, 0x408977f2, 0x40abfefe, 0x408f1c81, 0x4094a012, 0x409871a0, 0x408c920f, 0x40970e88, 0x409746da, 0x40b4ee95, 0x408749c9, 0x40999fb6, 0x4079ceef, 0x40a4f412, 0x406c2202, 0x409e3ddc, 0x40972bb7, 0x40b82e6d, 0x408a05bf, 0x407d7eed, 0x40bfe83c, 0x405a48fe, 0x40a05ebb, 0x40d6c11e, 0x40968a71, 0x4053e2ed, 0x408a147e, 0x40acf966, 0x40925394, 0x406e411a, 0x409a6e15, 0x40a8e53e, 0x40bc3ba1, 0x4098b3d1, 0x4094b96d, 0x40c2c76d, 0x406e14d7, 0x40913a66, 0x4099be25, 0x4091116a, 0x409381c4, 0x40848ec8, 0x40867bf2, 0x4052dd72, 0x4068131c, 0x404acf86, 0x40740abe, 0x406d41db, 0x4088d4c4, 0x4083c98f, 0x4090bf35, 0x406d3f98, 0x4064b7cb, 0x409b7d89, 0x40357362, 0x406f7acb, 0x40968a71, 0x40a1249f, 0x40555f8c, 0x405b2488, 0x409ce6f6, 0x4066961a, 0x4033224c, 0x4082b820, 0x409cf87e, 0x409aeb02, 0x407006e1, 0x40822f32, 0x408d5f1b, 0x4027968a, 0x40562f84, 0x4077d7f7, 0x407a939d, 0x406e53c8, 0x4061b7ea, 0x408c7074, 0x40627f4b, 0x405e8dea, 0x403ed14c, 0x407612c3, 0x407e4d0f, 0x409103e9, 0x40524ec7, 0x408e1a4b, 0x407a47c3, 0x4047b166, 0x409fdc1b, 0x40273406, 0x4084b8f3, 0x4053e2ed, 0x40555f8c, 0x409c1d4f, 0x40727c2e, 0x4097674f, 0x4055ffc1, 0x403c4ba1, 0x404abed4, 0x4072fd9a, 0x406a5a10, 0x408821a1, 0x40739e18, 0x40917ae5, 0x405cfb89, 0x408374b1, 0x407582dc, 0x40524438, 0x406c8129, 0x4086f3ee, 0x409a9681, 0x405b22f2, 0x405741dc, 0x406a518e, 0x408e32df, 0x406f9a92, 0x408da8c5, 0x4071c120, 0x4093ab2f, 0x407abcc4, 0x40698231, 0x40a35c0f, 0x4038a311, 0x408a8bd6, 0x408a147e, 0x405b2488, 0x40727c2e, 0x409f9a81, 0x4089084b, 0x40632608, 0x404824f4, 0x40761935, 0x40855387, 0x4087c8d7, 0x40902161, 0x408ab416, 0x409cae38, 0x40636547, 0x40865709, 0x4087e2a4, 0x407185b2, 0x406aa92d, 0x40a06f6b, 0x40c16d98, 0x409059ac, 0x409ca25f, 0x407bacc4, 0x40aebf3d, 0x4095fffe, 0x40aec80b, 0x409a90d7, 0x40c91399, 0x408bd2a3, 0x4082704e, 0x40cd9831, 0x4054a7b1, 0x40acbece, 0x40acf966, 0x409ce6f6, 0x4097674f, 0x4089084b, 0x40dcebc8, 0x408db29e, 0x405f06e7, 0x4091c16c, 0x40adc0a0, 0x40ad5f31, 0x409b4b14, 0x40a00a96, 0x40ba3696, 0x40802ff8, 0x409063f7, 0x4098582a, 0x409b9919, 0x40977a7d, 0x4076420b, 0x40984e50, 0x40569505, 0x40696321, 0x405ebd33, 0x4085d90f, 0x4079179a, 0x40844a86, 0x40616b7f, 0x409df8f2, 0x4071dfa6, 0x406256a6, 0x40a4a9e7, 0x403a6b29, 0x40716b2f, 0x40925394, 0x4066961a, 0x4055ffc1, 0x40632608, 0x408db29e, 0x409b662d, 0x4027381d, 0x405e5faf, 0x40792b00, 0x4082be8c, 0x408be396, 0x407602ba, 0x40ab6117, 0x404bcae0, 0x406e78d5, 0x407b6f33, 0x406b5a39, 0x4043695a, 0x401ed0a6, 0x407f528d, 0x40230703, 0x4032f440, 0x4028ac4e, 0x40645c15, 0x402a9ca0, 0x40670471, 0x4043ac13, 0x406ad4cf, 0x4055fc51, 0x402bb9ee, 0x4086b197, 0x4028de98, 0x405c087d, 0x406e411a, 0x4033224c, 0x403c4ba1, 0x404824f4, 0x405f06e7, 0x4027381d, 0x40725343, 0x406465f7, 0x4062430b, 0x406ee562, 0x406d5a15, 0x4043d2ff, 0x407c01f4, 0x40366739, 0x4075e503, 0x405855e9, 0x404fa1cc, 0x40512b66, 0x40672930, 0x408a929f, 0x40426c3b, 0x40523127, 0x407351cb, 0x4092006a, 0x4061df7c, 0x408956b6, 0x4088922b, 0x409e9d06, 0x408631dc, 0x4055b62b, 0x409d8141, 0x404de4d9, 0x4086760e, 0x409a6e15, 0x4082b820, 0x404abed4, 0x40761935, 0x4091c16c, 0x405e5faf, 0x406465f7, 0x40a42c3b, 0x409865cd, 0x409fb37d, 0x408d00f6, 0x4076d90a, 0x409825f8, 0x404dacd9, 0x40772ad9, 0x407f12fc, 0x4083d6b5, 0x406fb95f, 0x409ef8d4, 0x40a8d327, 0x4076d513, 0x40831644, 0x406db56a, 0x409bf207, 0x40838a55, 0x40a26f5f, 0x4091ce21, 0x40b5364f, 0x408b91ff, 0x40848219, 0x40bca904, 0x40635991, 0x4096e68e, 0x40a8e53e, 0x409cf87e, 0x4072fd9a, 0x40855387, 0x40adc0a0, 0x40792b00, 0x4062430b, 0x409865cd, 0x40bd14bc, 0x40af427f, 0x408e0f99, 0x409f8f2a, 0x40a126be, 0x406ea8f0, 0x408a6b09, 0x4096add3, 0x408df41d, 0x40887baf, 0x40941030, 0x40aee41b, 0x4086135d, 0x4090eb06, 0x40841b92, 0x409c124c, 0x40876918, 0x409be06c, 0x409ddd17, 0x40bdf9c3, 0x408450ef, 0x40829418, 0x40b68f09, 0x4068c117, 0x409ae87f, 0x40bc3ba1, 0x409aeb02, 0x406a5a10, 0x4087c8d7, 0x40ad5f31, 0x4082be8c, 0x406ee562, 0x409fb37d, 0x40af427f, 0x40d56a68, 0x40a40a92, 0x40990e7d, 0x40b8464e, 0x405dc2ed, 0x4092e718, 0x408f0281, 0x408a033d, 0x4084b6cf, 0x4085d278, 0x40af7bdb, 0x407d2f81, 0x4081694a, 0x408c70c9, 0x40a6c9e2, 0x408c655d, 0x40999873, 0x4075085e, 0x40ad686d, 0x40990fc2, 0x40701908, 0x40b4beab, 0x4062a5a1, 0x4096c1b3, 0x4098b3d1, 0x407006e1, 0x408821a1, 0x40902161, 0x409b4b14, 0x408be396, 0x406d5a15, 0x408d00f6, 0x408e0f99, 0x40a40a92, 0x40beb9a1, 0x4093b2b8, 0x40ae9b25, 0x40829082, 0x409ae3e6, 0x4095ba01, 0x408712bc, 0x4085ee07, 0x409f05a3, 0x40ab0ecd, 0x406a673a, 0x4065dee9, 0x4071aea8, 0x40918c85, 0x4086c57d, 0x409224ed, 0x4078916a, 0x40ae34f8, 0x40833259, 0x4080de4e, 0x40a7b55a, 0x4043f665, 0x408977f2, 0x4094b96d, 0x40822f32, 0x40739e18, 0x408ab416, 0x40a00a96, 0x407602ba, 0x4043d2ff, 0x4076d90a, 0x409f8f2a, 0x40990e7d, 0x4093b2b8, 0x40cc4e0f, 0x4098eb6e, 0x40701318, 0x40940e11, 0x40888298, 0x4087777b, 0x40818cbd, 0x4099972a, 0x40be6bb7, 0x40949883, 0x40a45210, 0x408c6d4d, 0x40acc145, 0x40939eee, 0x40b8ab87, 0x409e9a62, 0x40c119dd, 0x409c17ab, 0x4088a2c3, 0x40d55a4f, 0x4078db90, 0x40abfefe, 0x40c2c76d, 0x408d5f1b, 0x40917ae5, 0x409cae38, 0x40ba3696, 0x40ab6117, 0x407c01f4, 0x409825f8, 0x40a126be, 0x40b8464e, 0x40ae9b25, 0x4098eb6e, 0x40f87b8e, 0x40851bb6, 0x40a2b97b, 0x40ae6b61, 0x4096fec4, 0x40901d1c, 0x407471e3, 0x408ddef9, 0x405c4de1, 0x4066392b, 0x4063c485, 0x40979153, 0x404e9c03, 0x40881149, 0x402b581d, 0x4088a140, 0x40789a31, 0x404878f8, 0x409c877b, 0x40281330, 0x408f1c81, 0x406e14d7, 0x4027968a, 0x405cfb89, 0x40636547, 0x40802ff8, 0x404bcae0, 0x40366739, 0x404dacd9, 0x406ea8f0, 0x405dc2ed, 0x40829082, 0x40701318, 0x40851bb6, 0x4091e4b3, 0x40825a84, 0x4089d85b, 0x4058f64e, 0x40704059, 0x407f53ed, 0x40a0e3dc, 0x407457fa, 0x406d7190, 0x40664f27, 0x4093c2ee, 0x4080aca0, 0x40948fc9, 0x4061eaad, 0x40a0d5bc, 0x408a774e, 0x40674d78, 0x40ac4a90, 0x40507c7c, 0x4094a012, 0x40913a66, 0x40562f84, 0x408374b1, 0x40865709, 0x409063f7, 0x406e78d5, 0x4075e503, 0x40772ad9, 0x408a6b09, 0x4092e718, 0x409ae3e6, 0x40940e11, 0x40a2b97b, 0x40825a84, 0x40a91500, 0x40876009, 0x40793944, 0x408761c0, 0x409b1c72, 0x40a0681f, 0x4082fa66, 0x408e84be, 0x407d5160, 0x40a2b1d5, 0x4071eb5f, 0x40ace0fb, 0x406a9e68, 0x409ea090, 0x40984c2e, 0x4076e17c, 0x40c12c9c, 0x406d3edd, 0x409871a0, 0x4099be25, 0x4077d7f7, 0x407582dc, 0x4087e2a4, 0x4098582a, 0x407b6f33, 0x405855e9, 0x407f12fc, 0x4096add3, 0x408f0281, 0x4095ba01, 0x40888298, 0x40ae6b61, 0x4089d85b, 0x40876009, 0x40c0d8a1, 0x40891afe, 0x408bc4d8, 0x408b9b5a, 0x408e1cb7, 0x404f0bc6, 0x40709d6b, 0x40723833, 0x40981f7d, 0x405da317, 0x408790ea, 0x407a998c, 0x409e8c2c, 0x40891f41, 0x4055a912, 0x40a489ee, 0x406189ad, 0x408c920f, 0x4091116a, 0x407a939d, 0x40524438, 0x407185b2, 0x409b9919, 0x406b5a39, 0x404fa1cc, 0x4083d6b5, 0x408df41d, 0x408a033d, 0x408712bc, 0x4087777b, 0x4096fec4, 0x4058f64e, 0x40793944, 0x40891afe, 0x40a98bce, 0x407d8a2e, 0x4085bdd0, 0x4087dc7c, 0x4072c850, 0x4081ecd4, 0x40550ca7, 0x4092daff, 0x405765e7, 0x40906964, 0x4068c4eb, 0x408c0a69, 0x4087ec89, 0x40550c9c, 0x409e41ca, 0x403f7bb0, 0x40970e88, 0x409381c4, 0x406e53c8, 0x406c8129, 0x406aa92d, 0x40977a7d, 0x4043695a, 0x40512b66, 0x406fb95f, 0x40887baf, 0x4084b6cf, 0x4085ee07, 0x40818cbd, 0x40901d1c, 0x40704059, 0x408761c0, 0x408bc4d8, 0x407d8a2e, 0x40a953c2, 0x3f400000, 0x3e800000, 0x3e800000, 0x3f400000 }; static const uint32_t in_rnda_dpo[3111] = { 0x3f800000, 0xbdfd5257, 0x3f348d0c, 0xbf800000, 0x3ea2c8fa, 0x3e2159be, 0x3de561bc, 0xbe970520, 0xbe55de90, 0x3d8f7ad4, 0x3f800000, 0x3ee077d8, 0xbee27b0d, 0x3eccc986, 0x3e047739, 0x3e8ccec4, 0xbe73fffb, 0x3ea0c744, 0x3de5a13e, 0x3e636a56, 0x3eb30620, 0x3eeb5fd0, 0xbdf835c4, 0xbf0986be, 0xbf1749d9, 0x3ed6cfc2, 0xbefdeda7, 0xbf800000, 0x3f01a9e5, 0xbe8aa4d7, 0xbe9eb2c4, 0xbeaa2143, 0xbe481734, 0xbe1ba243, 0x3d17033d, 0xbd348605, 0xbdd3c0fc, 0xbefb915f, 0xbe132643, 0x3d1f445a, 0xbea97863, 0xbd8eb6dd, 0xbe497687, 0xbf800000, 0x3e1a6baf, 0x3e58bbd1, 0x3e4f7e0a, 0xbe4a4853, 0xbe7b9de0, 0x3eb104b6, 0x3e999703, 0xbc6a56cd, 0xbe8e390f, 0xbebe623c, 0xbf4f1a1b, 0x3e51cc02, 0x3cf0a345, 0x3de22884, 0x3ed0130c, 0xbecbf936, 0x3dfd9c2e, 0x3e672a3d, 0xbdeacfbc, 0x3e8b2604, 0xbf178127, 0xbf0e8281, 0x3ee2021b, 0xbf3a5f5c, 0x3e214d62, 0xbdf15413, 0xbe0f3a8a, 0xbf0557b1, 0x3d9d3d07, 0x3e915d0d, 0x3dd99c34, 0xbe86018b, 0x3ed83ec3, 0x3f282bb8, 0xbdf693c7, 0xbd0964b0, 0x3eeb59e9, 0x3df6ce20, 0x3e5acd39, 0x3ee3483b, 0x3e173272, 0x3dcdd121, 0x3f347fa1, 0xbec77ad6, 0x3d7342dc, 0x3e9c8401, 0x3cf6e92f, 0xbeaed8be, 0x3e9327ab, 0xbb8c47e7, 0x3e180c86, 0x3e8000ad, 0x3f08b0ce, 0xbf3a8345, 0xbdefe23e, 0x3e3491aa, 0xbef5cde0, 0x3c42d67e, 0x3ea0a82e, 0x3efa805b, 0x3ef0fab5, 0x3d377b45, 0x3cd44c4b, 0x3dc70ea2, 0xbe80f5cd, 0xbe70b75f, 0xbd5d58cb, 0xbee2f7ff, 0xbd2c7ab9, 0xbe25b92f, 0x3eba588c, 0x3edb9833, 0x3d547885, 0xbc5174cb, 0xbe9f230f, 0xbe4abe76, 0x3f043509, 0xbdfd5975, 0xbf30887c, 0x3e69f9cb, 0xbed1df6f, 0xbd90ad37, 0x3df6515c, 0xbe830551, 0x3e264581, 0x3ea40b59, 0x3cf54548, 0x3f0990b1, 0x3de705ad, 0xbeda1f8c, 0x3d4c08aa, 0x3f013d65, 0xbdeae8f9, 0xbd2e4349, 0xbda3c2b5, 0x3f800000, 0xbf319e83, 0x3d9e5936, 0xbe8a4c70, 0x3dc662cb, 0xbf173257, 0x3ea15704, 0xbd12edc3, 0xbd99beb9, 0xbf25666e, 0xbe8aa4ff, 0x3ea00260, 0xbf2fc213, 0x3f200a21, 0x3f562c9a, 0xbd1b7d29, 0xbe14d55a, 0xbf1c3e83, 0x3deafb46, 0xbdd2e9cb, 0xbed2d098, 0xbea6290e, 0x3e90d253, 0xbd9d5bef, 0xbed2bb3b, 0xbea7f8bb, 0xbef12144, 0x3e7d5e13, 0xbd97e9ed, 0xbea23205, 0x3d471899, 0xbea05c14, 0xbdbc6e19, 0x3ed64b8b, 0x3eaa4746, 0xbd927456, 0xbed6f409, 0x3e071e01, 0x3e5e2875, 0xbc9a1dc0, 0x3e0c97c1, 0xbe0a9a08, 0xbf4b3304, 0xbcd6161a, 0xbe3ac18f, 0x3ee8c181, 0x3dc5d44a, 0x3f28b2de, 0xbe3f367a, 0xbba1698f, 0xbf42f186, 0x3e997b2f, 0xbeb8610d, 0xbdf77b96, 0x3e20d44c, 0xbec2dadf, 0x3ec13e97, 0xbc3d1756, 0xbeebcd2b, 0x3da94fca, 0x3dfdb593, 0xbe968d2e, 0xbce52211, 0xbf800000, 0xbe510b4c, 0xbdb74a3a, 0xbecc2f22, 0xbe8ebbd4, 0xbedaf4ad, 0xbe9b608d, 0xbe6ea51b, 0xbef56d4d, 0xbd0c14ff, 0xbec46456, 0x3cc073a8, 0xbf27f760, 0xbe39e070, 0xbebfbba4, 0xbeeef4e5, 0xbeff1af2, 0x3ed264b8, 0x3ca1a216, 0x3df836cb, 0xbca876e4, 0x3e7d621c, 0xbda618b4, 0xbe680c2d, 0xbe968573, 0x3d173840, 0x3e52f18b, 0xbe51b24b, 0x3c6f9297, 0xbe8b666a, 0xbe861b68, 0xbdc6cfdd, 0xbebef516, 0xbd4d73df, 0xbec1854d, 0x3d27c6d0, 0x3d36e31e, 0x3d157999, 0x3e851f15, 0xbeaf7e12, 0xbe964566, 0x3e21bfe8, 0x3d9cfdcf, 0xbe822d79, 0x3e8460ae, 0xbde6113a, 0x3e7f62c5, 0xbdca3698, 0x3dabdc6d, 0xbd87a752, 0x3cd69974, 0xbec67962, 0xbe7bcb46, 0x3cf7b515, 0xbedaa29a, 0xbebb3ef7, 0x3e50b8e5, 0x3dc383b7, 0xbee6ea27, 0xbed732e1, 0x3ee535ef, 0xbd8461d7, 0xbe5f27be, 0xbda4aec2, 0xbe883105, 0xbebfec04, 0xbd083009, 0xbd8cacea, 0x3e9b58f2, 0xbe4fff2b, 0x3ea617de, 0xbea63ab3, 0x3dec6c9c, 0xbe840082, 0xbf0945b1, 0x3e20f066, 0x3cbc77bd, 0x3f748f9c, 0xbec93154, 0xbeb5a775, 0x3ce728b1, 0xbe84852d, 0x3dfdc03f, 0xbd817780, 0xbebb524f, 0x3e3b80e6, 0xbdce420c, 0x3ed73447, 0x3e0050ed, 0xbd9b2ed9, 0x3e829df2, 0xbc10c273, 0x3e4e15ba, 0x3e650cb5, 0x3e9e097f, 0x3e1eb181, 0xbebbccb0, 0xbd57f4c8, 0xbeb99569, 0xbd9c273d, 0xbf0d0f58, 0xbea06422, 0xbd47b6e1, 0xbf3ea72b, 0x3d80f647, 0x3d225497, 0x3e596592, 0xbe7e9b40, 0x3e248658, 0x3dcdd554, 0x3c9a752d, 0xbe951e7c, 0x3e9a7be2, 0xbe9c6cd8, 0xbe393295, 0x3ea07cea, 0x3ec7ad42, 0x3ec1ec4b, 0x3e9773d8, 0x3e33255f, 0x3ea4f978, 0xbe5af78f, 0x3e4ccec8, 0xbedfc51c, 0x3e08d285, 0x3dd0eeb9, 0x3e621869, 0xbe34b765, 0x3eade921, 0xbd5e3536, 0xbe847e00, 0x3e792f72, 0xbdc453d4, 0xbe78250b, 0x3e5006c3, 0x3ee43fca, 0x3d759b3a, 0xbd54bde3, 0x3e50d74b, 0x3db1cbf6, 0xbef9033b, 0x3f1ea52a, 0x3e25640a, 0x3eb59597, 0x3d4395bd, 0x3e14fe53, 0xbf14496b, 0xbe22e5d0, 0x3ee96f56, 0x3f15826d, 0x3edee506, 0xbe754c8a, 0xbeb7a13f, 0x3ed0e940, 0x3d19671b, 0xbf0be555, 0xbeb7855b, 0x3e5f72b6, 0xbe12620a, 0x3eb25650, 0x3c830c33, 0x3f188b33, 0x3c6a883f, 0xbefe3660, 0xbe84550f, 0xbdfa5559, 0xbe898f88, 0xbdd8fbc2, 0xbf31f4b8, 0xbb626a61, 0xbf1c8dcf, 0xbe915d26, 0x3d47e220, 0xbe7826d6, 0xbea3e145, 0xbd734545, 0xbe50f9a2, 0x3ec36c9b, 0x3eca6a1e, 0x3e445867, 0x3ef290d3, 0xbe8eb689, 0xbf296b25, 0xbea6bd15, 0x3dc868a1, 0x3e3c4510, 0x3e32ba91, 0xbe52e412, 0x3e1e6c13, 0xbec82d4b, 0x3d47c6f0, 0xbf0342b9, 0xbdb6c222, 0x3e200050, 0xbef39a4d, 0x3da5ca14, 0x3b733d72, 0x3e4b5b5f, 0xbdb4873c, 0xbe3cc79f, 0xbea3e99d, 0x3e949d42, 0x3e4ca65d, 0xbe50933c, 0x3d0ab801, 0x3ea6c805, 0x3e811774, 0xbefcad40, 0xbdfb7da4, 0x3da38ca5, 0x3da36adc, 0x3c2c2ff9, 0x3db22737, 0x3d8d6cdf, 0x3e9b1083, 0xbe906bc2, 0x3f10ffae, 0xbbbb5614, 0xbdbce1a3, 0x3eb95abf, 0xbe5791e7, 0xbd9db6b8, 0xbdfd58ee, 0xbf333f8c, 0xbe83ffd6, 0xbe492d7a, 0x3eb6db77, 0x3ec6cfc3, 0x3f440074, 0x3ebcb83f, 0xbe674dfd, 0xbe8d7172, 0x3eca40fc, 0x3e43c36b, 0xbedd3faa, 0x3ee4ca35, 0x3f800000, 0xbe474f89, 0xbe86cf82, 0xbe46e44a, 0xbcca96aa, 0xbefcc40e, 0xbe6a2d96, 0x3dc06725, 0xbc5f2199, 0x3e10e599, 0xbe3a3a22, 0xbd38b6a2, 0x3f19cbbe, 0xbe0c37e7, 0xbeb26f7b, 0xbe4a0983, 0xbec5a234, 0x3e24b809, 0xbe66ea6a, 0x3e5e7994, 0x3e29256b, 0x3d3e5707, 0xbf24e64d, 0xbe600f22, 0x3ee764be, 0x3e4380cf, 0x3e91bbde, 0x3c85c11e, 0xbe730fb7, 0x3e453154, 0x3e4746e0, 0xbdac9a3c, 0xbedb4cc0, 0x3ce0a66f, 0xbee0f8fc, 0xbe957d09, 0xbe3d3335, 0xbe741783, 0x3e7bfe63, 0x3e616c89, 0xbe0fa76f, 0xbec876cf, 0x3d2a4c6d, 0xbd8d7863, 0xbe0a2574, 0x3e2e1c0a, 0x3eae939e, 0xbdbeb7f0, 0x3e67c834, 0xbe0c7690, 0xbf3101d4, 0x3ea8ea94, 0xbed5d8e8, 0x3e88a674, 0x3e309a27, 0x3edf7102, 0xbf3baa87, 0xbe71c361, 0x3eb8d1f4, 0xbda0b249, 0xbe30e98c, 0x3ea7f200, 0x3da095f9, 0xbd96f1d8, 0x3ef883e6, 0x3ec14449, 0x3ec114d2, 0xbe6cfda1, 0x3e4db5a4, 0x3eca36ab, 0x3f15941f, 0x3c8a236b, 0x3cf29598, 0x3b582d2b, 0x3ea4a7c1, 0x3e7374c1, 0xbdd30359, 0xbd634a8c, 0xbe968bc8, 0x3eabac23, 0xbbf92041, 0xbeb1f785, 0x3ec3c617, 0xbf5732ed, 0xbf03f8ca, 0x3cafd744, 0xbe55c76a, 0xbe5be152, 0xbeb6d6f5, 0x3e9cec66, 0x3e45c332, 0x3ea6deac, 0x3df3d683, 0x3e173630, 0xbe3b6e04, 0xbd6db15c, 0x3c99afa6, 0xbe1f8422, 0xbda5edc5, 0xbe3ed83a, 0x3c646797, 0xbe0c85cb, 0x3da650c5, 0xbf08c2fb, 0x3f230298, 0x3e41bca4, 0x3eb51a99, 0x3de22de8, 0x3b79a51e, 0x3ed99295, 0xbe13936b, 0x3d9a2514, 0xbf4a122e, 0x3eb79b29, 0x3ec6ff03, 0xbdf94097, 0xbec52b75, 0x3ddb1013, 0x3f0241e5, 0xbcc771cd, 0x3d83a114, 0x3e858cb3, 0xbea5c9ee, 0xbeda6439, 0xbdf9c697, 0xbecc4d04, 0x3e83f209, 0xbed0b7ba, 0xbf49bcd6, 0x3e263009, 0xbe8aa199, 0xbf0dee70, 0xbe756d09, 0xbec96ec7, 0x3e09b04c, 0xbe5981fb, 0xbc852a11, 0x3ea3b20e, 0xbe4926fb, 0x3e729a0f, 0xbebea963, 0x3e4f97ad, 0x3db331a5, 0xbf1369d7, 0x3c33dedb, 0xbc92c6cb, 0x3e38a5d5, 0x3f06975d, 0x3e165503, 0x3c71a370, 0x3d197c45, 0xbf32c5bb, 0x3db2eeac, 0x3ed15258, 0xbdf702e2, 0xbd3dff12, 0xbeda7105, 0xbb3137d5, 0x3ec780a9, 0x3e2901a4, 0xbe8e6cbc, 0x3e8b8188, 0xbe940b3f, 0x3e12d009, 0x3e2f5508, 0x3c116e99, 0xbd81b508, 0x3e9f8813, 0xbf132a1f, 0x3c68668a, 0xbe438cdd, 0xbe2b8aca, 0x3f38fe6f, 0x3ea168ec, 0x3e1798c9, 0xbe931e5c, 0x3e7296bc, 0xbd09fd46, 0x3ee3201d, 0xbe5cfc29, 0x3f0171c6, 0x3e4f95ad, 0xbdc2ce92, 0xbea1732d, 0x3e98b46f, 0xbda451c5, 0x3dee0b06, 0x3f478b49, 0x3e2af6e1, 0xbce70c4a, 0xbefdfc4e, 0xbdec8785, 0xbe65142a, 0xbd25d08d, 0x3f60daed, 0x3eba6e6e, 0x3cc05acb, 0xbf28c54b, 0xbe5a68e4, 0xbf110a5f, 0x3ebacb38, 0xbeb66365, 0xbdfa3a48, 0xbdd25a03, 0x3cb3b46b, 0xbf2ca741, 0xbf19e33e, 0x3ded0980, 0x3e2917b6, 0x3d1d4637, 0xbec4b71c, 0x3e895b95, 0x3efb148f, 0x3f0a702b, 0x3ce0c5a4, 0xbd6197b5, 0x3c58e950, 0xbd937ec1, 0x3eb8fb81, 0x3e4cf0f8, 0x3d95d3fb, 0xbeeb2100, 0x3ea06fa5, 0x3eac6508, 0x3d1da927, 0x3e1b90f2, 0xbd105584, 0x3e84f68f, 0xbd6d4c2f, 0xbd283f2a, 0x3e16b818, 0xbe80cf4c, 0x3e4f7e1a, 0x3eaa80d9, 0x3f13fc31, 0x3e99a5f7, 0x3f585e35, 0xbf08fc46, 0xbf34c99a, 0x3f800000, 0xbe61f5a0, 0x3e39ad22, 0x3e4f35f2, 0x3f17400f, 0x3e31eeda, 0x3e5e4ddf, 0xbdf9e363, 0x3cce1530, 0xbf2cdb99, 0x3e8b8454, 0x3e446953, 0x3e5b00d9, 0x3d911e68, 0xbe9d2f51, 0x3d676960, 0xbe9cdcc6, 0xbeadaf6f, 0x3e341a72, 0x3e501644, 0xbe563a07, 0xbedc78f2, 0xbf3b9e52, 0xbf6b4f73, 0xbec5ece6, 0xbba28655, 0x3f1a15ab, 0x3d906cb4, 0x3e13fe05, 0x3eec51b9, 0xbe6ea906, 0xbe86c56a, 0x3f272a80, 0x3d1a4499, 0xbeb7a9d6, 0xbd574916, 0xbe332202, 0xbef8201e, 0xbe1fb540, 0x3e63a8b4, 0xbef2b1b3, 0x3e59f6b8, 0x3e3a3e55, 0xbee07ab8, 0x3dfa0baf, 0xbe395380, 0xbebdc468, 0xbe946bc0, 0x3eeb3305, 0xbc13e43c, 0x3f0c0355, 0xbc936b29, 0x3f3ca5a3, 0x3e2a5eb1, 0x3e89c40a, 0xbed80d41, 0x3f05ba85, 0x3f5041e0, 0x3e84d8d8, 0xbee6e33f, 0xbd13cbe1, 0xbebfd9c4, 0xbe42385e, 0x3d203ddd, 0xbe1f0401, 0xbee7c8a5, 0x3d265d77, 0x3dcb6c99, 0xbdea7b45, 0xbe8ce34e, 0xbf044814, 0x3f5921b1, 0xbe4c23b9, 0x3ec3da62, 0xbe370e59, 0x3ef3d6bf, 0xbd815b27, 0xbea61e40, 0xbe95b127, 0x3f1d876d, 0xbe3e7f2e, 0x3ed64ee9, 0x3e2faa82, 0xbecff3d3, 0x3e12410c, 0xbc09ee3f, 0x3e900e8f, 0x3e805c12, 0x3eac830f, 0xbed14b23, 0xbd5c247a, 0xbf4f512d, 0x3d7f7cb3, 0x3f16057a, 0xbea9f54a, 0xbecf68ee, 0x3d2785b1, 0xbe222839, 0xbda4c76b, 0x3eacba98, 0x3ddb1490, 0xbbffd2d0, 0x3e73de17, 0x3e4a81b3, 0xbdb78423, 0x3e6c09ac, 0xbe9f74d5, 0xbee08e22, 0xbe100ccf, 0xbe84f0be, 0x3c8b119a, 0xbd2f992e, 0x3dd00027, 0xbde6cc5e, 0xbf4226a7, 0x3e2f961f, 0x3eb6dcd2, 0xbef4cecc, 0xbf01f9e4, 0x3efdd526, 0x3daeb009, 0xbe5cd020, 0x3e33c967, 0x3e54581b, 0x3f38e053, 0xbed4df89, 0x3c1d5e7e, 0xbeccaecb, 0x3e6a03b3, 0x3f2f6c28, 0x3e61bc9a, 0xbef47f89, 0xbe43d066, 0xbe95bfe7, 0xbd917b5f, 0x3f135fd6, 0x3eb86cf4, 0xbf3a9cc7, 0xbef521f5, 0x3eed0233, 0x3dc6ae35, 0xbed9dffe, 0xbe87472f, 0xbe4b497f, 0x3e00c428, 0xbe58b620, 0xbeb3e59e, 0x3dffbca0, 0xbf1c6580, 0xbedf527a, 0x3ebf2fc4, 0x3e62f8a8, 0xbd5bf5a7, 0x3e5fe5ad, 0xbe1dd638, 0x3de2f622, 0xbd672b7d, 0xbe17cc8b, 0xbf025b2b, 0x3ea190c0, 0xbef97a87, 0x3e00c329, 0x3d9ba719, 0x3e761023, 0xbe8c129a, 0xbec4b286, 0x3e6f277f, 0x3e9a0aba, 0x3e830bf7, 0x3e7ec2d1, 0x3e3c3c5b, 0x3d649da9, 0x3f284891, 0xbe36a932, 0xbec296ab, 0x3c4b750d, 0x3e1d3933, 0xbe74ee97, 0xbe1165cd, 0xbd0ac069, 0xbe84b619, 0xbe09fe29, 0xbeb49736, 0x3e4702e0, 0x3dff5c2e, 0xbe86b257, 0x3e55e234, 0x3ecad3e5, 0xbd7bcea5, 0xbe06b36d, 0xbde8c533, 0x3e32a43d, 0xbef8aa7d, 0x3ec3d768, 0x3f23d20b, 0xbdc64cfb, 0xbeb7bf9c, 0xbf33b68b, 0xbddf4b7a, 0xbf031709, 0xbd1b90b7, 0x3e8a35d9, 0x3eb179b9, 0xbe389c58, 0x3df2e6a7, 0x3e920c16, 0x3ed7d7ed, 0xbf3707f1, 0x3e85f13e, 0xbf3aa563, 0x3e025ea5, 0xbedd0b21, 0xbd98d66d, 0xbe89657a, 0xbf180937, 0xbf094e61, 0xbe2c6080, 0xbe61b9b2, 0xbc9dbd4c, 0x3f0b665c, 0x3e6f3c0e, 0xbe9c771a, 0x3f05b32e, 0x3f59f074, 0xbc84c0de, 0x3f2facf1, 0x3c2487ad, 0xbda4a781, 0x3e570e2b, 0x3efa3d82, 0x3d13d512, 0xbdd281d6, 0xbe52942d, 0x3dcb9858, 0x3cdff3c2, 0x3ea20697, 0x3d61e688, 0x3f340e1f, 0xbde4eb93, 0x3ef9822e, 0xbd988917, 0x3e8cdeba, 0xbe8b731f, 0x3eaf160c, 0x3dc7ba52, 0x3e6c1531, 0x3eaca00a, 0x3ece9332, 0x3f3af9af, 0x3d6b0635, 0x3f2ca41c, 0xbebed68d, 0xbe2e9402, 0xbf800000, 0x3d8349d4, 0xbe673071, 0xbf014858, 0xbe7cfe4c, 0x3ea64675, 0xbedd71c2, 0xbe2ddfe2, 0xbd9e9c76, 0xbeb94937, 0x3d6ace0f, 0x3f2ff6b5, 0xbd8f7e5c, 0x3e700bbd, 0xbe2df9d7, 0x3e8592dd, 0x3e2064b4, 0x3f3239ea, 0x3d88d617, 0x3ea06d75, 0xbc823077, 0xbefee487, 0xbdf9cc07, 0x3ed7b08a, 0x3d2a3206, 0xbe802996, 0x3de54536, 0xbd9459c4, 0xbe6d1119, 0x3e30ad12, 0x3d80864a, 0x3f12e787, 0xbf0e2298, 0xbed1c9ef, 0x3d8407c9, 0xbe8aea6a, 0xbf160d04, 0x3e4b3fc7, 0x3d89eeda, 0xbe8477e1, 0x3f266971, 0x3d317074, 0xbf2c48b3, 0xbd446d0b, 0x3d4f9816, 0x3e94b51d, 0xbed5e03b, 0xbe5f47c3, 0xbe61a1b3, 0xbf1b6d78, 0x3e64f7cd, 0x3e8db5d4, 0xbed65df2, 0x3cdb7777, 0x3dc959e7, 0xbde91945, 0x3eba2546, 0xbe5708e7, 0x3e714248, 0xbee3c58e, 0xbecccce4, 0x3eba95f9, 0x3eee6c87, 0xbe1deede, 0xbebb951b, 0xbe7f7319, 0xbdcda386, 0x3d023c68, 0x3eb85555, 0x3f06088f, 0xbcab47f1, 0xbeb08da0, 0x3e06ce14, 0x3e14996e, 0xbe28e638, 0xbe8e1fd1, 0x3e8bcbc9, 0xbe77559b, 0x3e206976, 0xbe18e082, 0x3eae98f8, 0x3ed8ca07, 0xbec0652d, 0xbcaf63cf, 0x3d29113b, 0xbe31ef11, 0x3ddef688, 0x3e59f7b0, 0xbd90146c, 0x3ecbd2e4, 0x3de43f2e, 0xbe710037, 0x3e9252d0, 0xbeb39320, 0xbd9e5808, 0xbf1d7422, 0xbecb3a43, 0xbe82cdf8, 0xbddeeba4, 0x3e01c0a6, 0xbe6ae6d8, 0x3f2baa94, 0xbaabf584, 0x3e82ae52, 0x3e72663b, 0x3e59ce20, 0xbedf1029, 0x3d0e8bd4, 0xbdcc8dfb, 0xbe9f8aba, 0x3e660a56, 0xbedd9337, 0x3e5a51a4, 0x3ea0de47, 0xbf0f14f9, 0xbef00b38, 0x3d54a579, 0xbe564831, 0xbef29818, 0x3e356b9b, 0x3cb96d22, 0x3dad130b, 0x3ea374dc, 0x3d874556, 0x3e655897, 0xbebf4aa4, 0xbe05eeea, 0xbe5fedd5, 0x3d46fb10, 0x3e94a301, 0xbed43e35, 0x3e1427dc, 0xbdfdaa97, 0xbefda324, 0x3f2252bb, 0x3eca1eae, 0xbefaf22d, 0xbf2a4760, 0x3ed0a384, 0x3ca17d17, 0x3eef36ea, 0xbf261626, 0x3e30bfb3, 0x3e891e6a, 0x3e86f63b, 0x3eb7b1e5, 0x3ef8a88d, 0xbecee78f, 0x3eb5b078, 0xbea648ed, 0xbdad36dc, 0xbe1997b3, 0xbe50bb8b, 0xbf0a9d62, 0xbeb3e09b, 0xbdcfcfeb, 0xbe9bd3f6, 0x3ea6dfa1, 0xbe2ce55f, 0x3dbc03ca, 0x3e0caf2e, 0x3d07987d, 0xbdb53b3c, 0x3e979299, 0x3e48a018, 0xbc50bee8, 0xbe4c2a32, 0xbd9fd8a8, 0xbce0d791, 0x3ec06ee2, 0x3e9fc4c5, 0x3e8e8a49, 0xbdcf473e, 0x3e0cb191, 0xbccc3f21, 0x3ec9803a, 0x3ea9fe82, 0x3bceec92, 0xbe682496, 0x3eb6b2eb, 0x3d5f72f0, 0x3ed34402, 0xbe561f31, 0x3be4b091, 0xbf015f79, 0xbe57ea90, 0x3eab80a3, 0xbd65ae9f, 0x3e68e36b, 0x3ef33fcd, 0xbd124b76, 0xbe5dcf59, 0xbde29c68, 0x3d3b0a0c, 0xbf13812c, 0xbdebe8ad, 0x3d564e7c, 0x3c22d887, 0x3e61674b, 0x3d4cf3e8, 0x3f0dcd24, 0xbf0bafee, 0x3e92982f, 0xbf800000, 0xbf1eb156, 0x3e871b89, 0xbe521e4b, 0xbeceef8e, 0x3d99a576, 0x3f0c63a0, 0x3ed23ebe, 0xbf1b32b9, 0xbf042a99, 0xbe11682b, 0xbef4e9b1, 0xbf0a5559, 0x3dad807c, 0xbeb1accf, 0xbdbcc8e8, 0xbdfd291c, 0xbdb18d76, 0x3d20acc5, 0xbe02ac16, 0x3ef6b111, 0xbeffb055, 0x3e2cf48a, 0x3e087af8, 0xbcd62d9d, 0xbec69773, 0xbe7996b4, 0x3db3f48a, 0x3ea4bef9, 0xbe99082c, 0xbe9536af, 0x3f5339a2, 0xbd0678b1, 0xbed1c3a5, 0xbe4fc840, 0x3e87e995, 0x3ef14e7c, 0xbe01d7ee, 0x3e5a8ca1, 0xbd04dc78, 0x3e930bb7, 0x3d939000, 0xbe5b79d5, 0x3d56e775, 0xbca86ce9, 0xbd742db3, 0xbe0a771c, 0x3cb326ee, 0x3e7ac2a6, 0x3bfab345, 0xbf3c0c65, 0x3e6e4dca, 0xbdfd6337, 0x3f0dd370, 0x3df46055, 0xbef99e34, 0xbef37aa0, 0x3df47ac3, 0x3ea9ef87, 0x3e6dce95, 0x3e62f657, 0xbea2e7f5, 0xbec63d79, 0xbdcf8ac4, 0xbcce2d77, 0xbe3cff80, 0xbe830fe8, 0xbec71370, 0xbc09c93f, 0xbe1a1fa7, 0x3ebf11ae, 0xbe4b11ab, 0x3f3c1045, 0x3ea391ec, 0x3cb845dd, 0x3f08aac9, 0xbe3cb1b1, 0xbf0a6d3e, 0xbda7cd6f, 0x3d89d125, 0x3e7932d7, 0xbd0f3e53, 0xbe27fe94, 0x3ead798a, 0xbe417ab1, 0xbf028860, 0xbe4fd847, 0xbe616498, 0x3d9b4f5f, 0x3eb41ef3, 0x3df4a1ad, 0x3e50a851, 0x3df22c75, 0x3ece5bcc, 0x3e4c0a42, 0x3e8afff4, 0xbdb46b4e, 0xbefe891d, 0x3e1c8f45, 0xbc22dc9e, 0xbd1aaf26, 0x3dea1fea, 0xbe44fc4b, 0x3df87873, 0x3cc722b7, 0x3d9a8758, 0xbdbb32cf, 0xbe9a4a8b, 0x3e69bf65, 0xbe6d6bdb, 0xbe2fe734, 0x3d3dac36, 0x3d238a60, 0x3e8119e0, 0xbea3ca1a, 0x3dc47ea5, 0xbd866625, 0x3e0fc8e7, 0xbe750568, 0xbd54470a, 0xbe9d20c9, 0x3ddb41c1, 0x3ddf96d7, 0x3e319487, 0xbe6a6921, 0xbe9e7dc4, 0x3d9d65b6, 0xbdab412f, 0xbebe0651, 0xbe7f7be3, 0xbde4bde4, 0x3f24e818, 0xbe03fa23, 0x3d64dfe0, 0x3ec9fa38, 0xbe57b46d, 0xbd4700cf, 0x3e90e437, 0x3f28dd83, 0xbdcdfe31, 0x3e18f517, 0x3db64c68, 0x3df3cb78, 0xbe0954ac, 0x3e87f08e, 0xbea0294d, 0xbdcdfdb5, 0x3e71f1da, 0xbeba808f, 0xbc5a3272, 0xbe44d9c0, 0x3e2c9d10, 0x3e8808e6, 0x3e3be442, 0xbd9ca636, 0x3efbf7ea, 0xbf521726, 0x3edeb86a, 0xbd6f3bd5, 0xbcc9575c, 0x3dd49295, 0x3eac387f, 0x3ed11796, 0xbf0a3087, 0xbe137b0b, 0xbdea5775, 0xbe8e76a4, 0xbf01e411, 0x3e4bed69, 0xbda41cac, 0x3dc50c95, 0xbe1b36f9, 0x3ebc1be8, 0xbe0e9af6, 0x3dbf9d3d, 0x3cea55b8, 0xbe7ceba3, 0x3d9cbeb4, 0x3d848711, 0x3ed51c41, 0x3e4d2d27, 0xbcdb6598, 0xbdb5bff2, 0xbd155524, 0x3ecfaf56, 0xbdfb4673, 0x3e71c896, 0x3ea8fd55, 0xbdf086ae, 0xbbb63cd0, 0xbebfded2, 0x3ec6ffe6, 0xbed574d7, 0xbe6dd765, 0xbe3939a5, 0xbe0e0e57, 0xbdd5005a, 0xbe95de9f, 0xbe42c884, 0x3eb09927, 0x3ecd0749, 0xbe204512, 0xbea5067b, 0xbd87178a, 0x3e99eb51, 0xbdaca2b1, 0xbe21691f, 0x3e3d2483, 0xbe14e358, 0xbe1baf23, 0xbe388e7d, 0xbe230f4d, 0xbe9cc6d6, 0xbdea65c1, 0xbebbe73a, 0xbd3a687f, 0xbf1ad532, 0x3ea4c188, 0x3e23f04c, 0xba2a71ec, 0x3d89649d, 0xbe75e3f2, 0x3d633367, 0xbe2be428, 0xbec9207f, 0xbf62c62b, 0x3e13c351, 0x3d55a8b2, 0x3f01e6d0, 0xbe27cf2c, 0x3e49847e, 0xbed0be47, 0x3ea62749, 0xbe9271f5, 0xbd9ca9cf, 0x3de2bc00, 0xbc98529b, 0x3e5f244a, 0xbe7b8fdc, 0x3ebaa273, 0xbe0de84d, 0x3e2a162a, 0xbe3b90e1, 0xbe64d17f, 0xbf0bd1e7, 0xbe93096f, 0x3eb62087, 0xbdb46a02, 0x3d0a80d0, 0x3ed5f7f0, 0xbdb00c1a, 0x3e1fb179, 0x3e05710e, 0x3e525e3f, 0xbd6bd741, 0x3dab8a66, 0xbe6dc168, 0xbe9f7e41, 0x3e491806, 0xbe64ace2, 0xbe536401, 0x3e78dbf5, 0x3ef59d10, 0x3c3aa8be, 0xbf5bbd94, 0x3e6b3db2, 0xbde4347f, 0xbf506130, 0xbd9e95cc, 0xbeb61b91, 0x3e9f2a5e, 0x3e698df6, 0x3c84e6ac, 0x3dd50f98, 0x3ea87ace, 0xbead87a5, 0xbed9980d, 0x3ead8c15, 0x3e36f6f6, 0xbe4852cc, 0xbe632fe2, 0x3ed42e30, 0xbc69f1cb, 0xbefa1d09, 0xbe937e59, 0xbdbac6dd, 0x3bfca763, 0x3e822872, 0x3f1765d4, 0xbe6b99c1, 0x3e571f0c, 0x3e9b8457, 0x3f18c739, 0xbe19b1b6, 0xbdcf35de, 0x3e92cf25, 0x3e294307, 0x3e3035d7, 0x3e99ad83, 0x3eb9bc75, 0x3dff7c46, 0x3e630a94, 0x3e517200, 0x3f13ed2c, 0xbe1e2de0, 0x3f0e7a04, 0xbdf44f0d, 0x3dfd9949, 0xbe64a4b8, 0x3de451fb, 0xbef746f7, 0x3ca5ea32, 0xbea82164, 0xbe95c36c, 0x3f31a3a2, 0xbe349841, 0xbe170053, 0x3e085455, 0xbc9eeaa3, 0x3d73f5f5, 0xbe3797d2, 0xbe498d09, 0xbdf7e5ee, 0xbeb0176d, 0xbe650e88, 0xbe093be1, 0xbd780d35, 0x3cbcc251, 0x3e304873, 0x3c66e8ae, 0x3d9f7092, 0x3e050c0a, 0x3de52cd7, 0x3ef6fe21, 0xbe7b93ab, 0xbde593e3, 0xbdb12c44, 0x3eb783ed, 0x3a2294a2, 0x3e7153a2, 0x3e043c9a, 0x3ecee54c, 0x3ea45ab5, 0x3ab6be00, 0xbeddce2b, 0x3f0cc7f1, 0x3f050070, 0xbe7c78d6, 0xbe444503, 0x3e087f7d, 0x3ec5456c, 0x3df6244d, 0xbecf81bf, 0x3e97a8bc, 0xbef43358, 0xbd676f91, 0xbbdfb1c9, 0xbe12011d, 0xbe575f1e, 0x3f0d3a5b, 0xbe794483, 0x3ec26ca1, 0xbe10b549, 0x3ebd3aea, 0x3dc15038, 0xbef61ee6, 0x3db3478c, 0xbdf03267, 0xbe4439e0, 0x3c5e1fcc, 0xbc352732, 0x3eead768, 0xbe192c3d, 0x3d4c46c2, 0xbe2e64b0, 0x3d2601b5, 0xbf545085, 0x3e16d868, 0x3e7630c3, 0x3dd63429, 0xbd341b4c, 0xbd9672f5, 0x3ee678bd, 0x3d80140b, 0xbde467de, 0x3b6fb638, 0xbc657470, 0xbe92839e, 0x3e267a03, 0xbed85897, 0xbe8df83e, 0x3eca8056, 0xbbb063d4, 0xbdc4e11c, 0xbeb04df2, 0xbe613cc2, 0xbe4e4352, 0x3ed1ff7e, 0xbdfb99c6, 0xbeaed2b2, 0x3e2168cb, 0xbe0863f8, 0xbe3ae2ca, 0xbd7c4c40, 0x3eb94bfe, 0xbe844b24, 0xbea0176f, 0xbe210577, 0x3dbf3ed7, 0x3f11a7ac, 0x3f0455fe, 0x3e6829e1, 0xbe7edec1, 0x3e86f72e, 0x3ddeeee7, 0x3e036877, 0xbd28258f, 0xbe31a9a1, 0xbbac0bac, 0xbe8aa4f8, 0x3e1f0da5, 0x3e33ed62, 0x3d5f2786, 0x3d8defba, 0x3daffe47, 0x3c3fe6c8, 0xbe1390ae, 0x3d9ee715, 0xbe3a9e0f, 0xbe8448a4, 0xbd132a43, 0xbdb8f70a, 0xbd6f5253, 0xbc9693c6, 0xbe2a9bd9, 0x3d8111e2, 0xbc72b945, 0x3e4b0b2c, 0x3eb2277b, 0xbe76311d, 0x3e806b51, 0x3eda8219, 0x3ea96d67, 0x3d8c6285, 0x3d29a280, 0x3e55db0f, 0xbe890066, 0xbbddabd1, 0x3f177011, 0xbe57ffea, 0x3d8820c1, 0x3e19499a, 0xbaefbafe, 0x3ed33a49, 0x3d1a2432, 0x3ef48cee, 0xbe142d31, 0x3e322a69, 0xbeefdd1a, 0x3d9b0c70, 0xbd92b815, 0xbea9be43, 0xbe05a977, 0xbd18545b, 0xbe3dce8c, 0x3e6979bf, 0x3df917af, 0xbf1481d3, 0x3dc38352, 0xbde48b45, 0x3ea03d30, 0xbd47318e, 0xbef73895, 0xbf135440, 0x3e80ba4e, 0x3d3e3e23, 0xbdd06d0f, 0x3e8ccb1d, 0x3d075996, 0xbe3f7381, 0xbe1b4e4e, 0x3d54528f, 0xbe60c04d, 0xbe3514d7, 0x3ebaf63e, 0x3d84258a, 0xbe70a7e0, 0xbe6c9fb4, 0x3dda06d7, 0x3cab6dd7, 0xbe96d6c8, 0x3e020d25, 0x3e33dee7, 0x3ddd59a7, 0x3ea898d9, 0xbe920eea, 0xbe437ac7, 0x3f199086, 0x3f369aa7, 0xbb15ed55, 0xbe1954f9, 0xbcd71328, 0x3e42669a, 0xbed7298e, 0xbda01931, 0x3e082447, 0xbe8fd7d0, 0x3e1f784f, 0xbdb786dc, 0xbe5106ce, 0xbcd1d6e6, 0xbefad77c, 0xbf39ae7d, 0x3e5368b9, 0xbdbb1a7a, 0x3e83e019, 0xbec98282, 0xbe8cc515, 0xbe800d19, 0x3ef86310, 0xbefe40be, 0xbe88863a, 0xbeecf19d, 0x3e97a9dc, 0x3ea00fa6, 0x3e4d9de4, 0xbd82ab37, 0x3ec90fe6, 0x3e7635c3, 0xbccbd5d0, 0xbe89aedb, 0x3de4348b, 0xbf01598f, 0xbda46825, 0xbeb70b90, 0xbe9e3006, 0x3dfe7702, 0x3e653a8d, 0x3e5cd82d, 0xbeaa8c5b, 0x3d60e222, 0x3f073596, 0xbeb30885, 0xbf493921, 0x3e65b4cc, 0xbe4e949b, 0x3e1099ee, 0xbd23cc80, 0xbed09f1d, 0xbdea5902, 0x3df89bf3, 0xbe461ddb, 0xbe3eb0f7, 0x3f3d1086, 0xbda3caa4, 0xbdb3bc8c, 0xbd6de19f, 0xbe1e611c, 0xbe0e69fa, 0x3dcb3b6d, 0x3eaba5d4, 0xbc612f03, 0x3eda762f, 0x3ea80183, 0xbe1026b8, 0x3dfe8c8e, 0xbe811556, 0x3d6d1553, 0x3d6dc149, 0xbeee7c39, 0x3e9135ac, 0x3e685207, 0xbececaa9, 0x3dba9dd0, 0xbbefb0f4, 0x3ea27857, 0x3e0d4595, 0xbe9da5b0, 0x3e9c2151, 0xbe9c72d5, 0x3e11b88c, 0xbf07f223, 0xbd567543, 0xbea563f8, 0x3d8e3afa, 0x3ea269ed, 0xbeb3c654, 0xbe85fdfd, 0xbe225694, 0x3dbeeb5f, 0xbc5ca234, 0x3c9b2ff9, 0xbe7fbfd4, 0xbeb1a9d3, 0xbd6aba06, 0xbc8d7456, 0x3e91881b, 0xbe2ac21c, 0xbe84e304, 0xbdb17c9a, 0xbd7a5665, 0x3d4d72fe, 0xbed9fe0e, 0xbe8bdcc1, 0x3e931f6e, 0x3ed8aee7, 0xbe81b072, 0x3eccec8f, 0xbe1e663b, 0x3e89b447, 0xbe432e58, 0x3e6863a5, 0xbe09966f, 0x3db5b067, 0x3e958e53, 0xbf2fe74d, 0xbe59cc8a, 0xbe51063b, 0xbe658d10, 0x3f0293a0, 0x3cc6a0c4, 0xbcbaf963, 0x3d87b096, 0x3e57dd28, 0x3ea13bc9, 0xbdbd885b, 0xbba2c234, 0xbea08276, 0xbe50e811, 0xbd301d21, 0x3d31ef58, 0x3eb35508, 0x3dd6d80b, 0x3d370929, 0x3e8412cd, 0x3da48732, 0xbe04bac0, 0xbe804c91, 0x3e587149, 0x3e501d66, 0x3eeb3e61, 0x3eba1cf7, 0x3c0d4a80, 0x3e24aefc, 0xbe72250a, 0x3e919178, 0xbebed7e9, 0xbe49e490, 0xbe758c40, 0x3eec5973, 0x3d152ca3, 0xbe73803a, 0x3c79b859, 0x3ec2af46, 0xbc677a45, 0x3da5b2f8, 0x3d648bf0, 0xbe478140, 0xbe3a89c3, 0x3bcb9162, 0xbd7b2a5b, 0x3dfd048f, 0x3eb91e9c, 0x3ee17e4d, 0xbe8789ea, 0x3da2b97c, 0x3ecf7ad7, 0xbdec3188, 0xbed2d5f4, 0x3ec5dbf5, 0x3de5a3cd, 0xbe87c035, 0xbc21c053, 0xbecb5a52, 0xbba1d46c, 0xbdc3dcf7, 0x3ed651f1, 0xbe763e63, 0x3ed9a455, 0xbe336b41, 0x3e4c32c2, 0xbcf82d0c, 0x3e9b1726, 0x3da00760, 0x3e11a751, 0x3eac346c, 0x3e1014c1, 0x3ec09f5d, 0xbde2fbad, 0xbe116df7, 0x3e20a2de, 0x3dd49886, 0xbe87adc0, 0xbe23bf01, 0xbd0e9cc6, 0xbe04e749, 0xbec2fe72, 0xbdd294e6, 0x3e4857f5, 0x3e2135b1, 0x3d4f7cee, 0x3dcf36fe, 0xbe44f845, 0xbd30bf20, 0xbf093507, 0xbea498e0, 0xbf2196ae, 0xbe2bbefc, 0x3d3c3c8c, 0x3e79d468, 0x3e4b0640, 0x3f03b2db, 0x3e56f4c8, 0xbd781da3, 0x3e6aea36, 0x3dc21275, 0x3e37253f, 0x3e6c2ebd, 0xbd5b90f0, 0x3deb4c4b, 0xbde8725b, 0xbe8c5213, 0xbd9fde02, 0xbd98754b, 0xbe622c92, 0xbd8b7b19, 0xbea759a2, 0x3f096919, 0xbd8f2175, 0xbe986e38, 0x3dfe3760, 0xbdc352df, 0x3e4cd8ad, 0xbed01ea7, 0xbf23624c, 0x3d8fd7bd, 0x3e5f8833, 0xbd99d1bf, 0xbe4083f5, 0xbe96904e, 0xbecbcd46, 0xbf14e5dc, 0x3e81725b, 0x3d758b57, 0x3ed954de, 0x3eab1ce2, 0xbd91b66a, 0x3e797973, 0xbef932f4, 0xbec61f35, 0xbf11d1eb, 0xbcdd12b8, 0xbe4a98ab, 0xbea12bb6, 0x3e287f6a, 0x3e2ce1db, 0x3e928c53, 0xbe9174d8, 0x3dc89c59, 0xbe6a5e27, 0x3da9a1cc, 0x3a93a198, 0x3e02015c, 0x3f13ad00, 0x3ef1cca1, 0x3e13175d, 0x3d7c8e51, 0xbe565047, 0x3eaec31f, 0x3c0507b1, 0x3d79d0be, 0x3ecabbd3, 0xbe9e1987, 0x3d7023b7, 0xbdb41d75, 0x3dc8ffdb, 0xbeab2fff, 0xbde34472, 0x3e41654f, 0xbea2b8b4, 0x3dc734f4, 0xbd828a5b, 0xbee23fd9, 0xbe6a780e, 0xbd86be69, 0xbd239a59, 0xbdfa1ab9, 0x3f0a6f78, 0x3e90f537, 0xbdaaf0cf, 0xbeb2362a, 0xbe2c3524, 0x3e622f4f, 0x3e923f3a, 0xbeb4c6cc, 0xbea092a6, 0xbf077526, 0xbe1c13e9, 0xbe2427c0, 0xba2d20ba, 0xbdbc164f, 0xbf1ad8c1, 0x3e37e545, 0xbf1b0268, 0xbe2952cd, 0xbe1fa549, 0xbe64ec63, 0x3ed46fae, 0xbd974efe, 0x3c0e86b9, 0xbd87e46f, 0x3ed233cd, 0x3d647b51, 0xbe83ed3e, 0x3e75e0c3, 0xbe97471c, 0x3d22b0df, 0x3e87b8b5, 0x3eb7c4d9, 0xbdbc2ccb, 0xbd431ae6, 0x3e44b104, 0xbeaa0a26, 0x3c7d1cc9, 0xbd03a029, 0xbed1d0b2, 0xbd538865, 0xbea9b60c, 0xbf42958e, 0x3f056f9c, 0xbf08e00e, 0x3f024c69, 0x3e83a72c, 0x3de7102c, 0x3e194521, 0x3d2e8aef, 0xbea8022c, 0xbe216c74, 0xbec73a9b, 0x3e36dc6f, 0x3edbcf6c, 0x3f09ed10, 0xbe1bd162, 0x3e15db88, 0x3db432ce, 0x3ea29bce, 0xbe81fbcd, 0x3e38da10, 0xbdd77b3d, 0xbea0e47e, 0xbe9120e5, 0xbe25a23d, 0x3e7548d4, 0x3e07ed0d, 0x3d5c96d4, 0xbe02b797, 0x3ee8fcaa, 0xbf3bded2, 0xbf1f22e6, 0xbe3b30a8, 0xbe81eeca, 0xbeca0eb0, 0x3e52687a, 0x3e06fabb, 0xbef024b8, 0xbdd690a1, 0x3e44a750, 0xbd2ea45a, 0x3d12c27f, 0x3d29ba3e, 0xbd2a94ad, 0x3eccee45, 0xbde077a2, 0xbea7aabc, 0xbde36f89, 0xbe2354ff, 0x3e35a33f, 0x3e01ae0d, 0x3d7d7653, 0x3db7e02b, 0x3efa90bd, 0x3d25d910, 0x3e1f23d5, 0xbd92b7ec, 0xbeab02ba, 0x3e317a51, 0x3e3053b5, 0xbe22f3aa, 0x3dab2e51, 0xbe00b65d, 0xbe2a2d63, 0x3bab1332, 0xbd38941e, 0x3d925a3a, 0xbd2910d2, 0x3d5ef85b, 0xbd461e2e, 0xb972f9fa, 0xbe3c434a, 0x3ed8b68c, 0xbe343957, 0xbb8eb1a9, 0xbf5eff65, 0x3e464a3c, 0xbd21c7d2, 0xbe726ef2, 0xbd8fd152, 0x3e311625, 0x3e88d6a2, 0x3b0ea241, 0x3d0e7370, 0xbe265252, 0x3ea4d117, 0x3c1c6392, 0x3eb52d2e, 0x3e5a0442, 0xbd28753e, 0xbd4dd178, 0x3ee9e166, 0xbeccc1af, 0xbec58e9e, 0x3df92ea4, 0x3dd51d5d, 0xbf0ab66c, 0xbe19862e, 0x3db0141b, 0x3ee037c7, 0xbe48a34f, 0x3e56b635, 0x3d56c7f1, 0x3dfb04fa, 0x3db3107f, 0xbed4525a, 0x3d811407, 0x3e780a42, 0xbea11f35, 0xbd5e9d1e, 0x3e3688a0, 0xbe2dd228, 0xbe6d46f5, 0xbf0269ec, 0x3e9ab3ad, 0x3e19e655, 0xbce8ccd0, 0xbdeae10e, 0x3e86c3a1, 0xbe1605e7, 0xbec3f38a, 0x3e5f3b8a, 0xbe171db1, 0x3e19675c, 0x3d619e84, 0x3c35d535, 0x3e208d40, 0xbe05fd7c, 0x3d989ad2, 0xbe89b8a8, 0x3e2ad8d1, 0xbe329c03, 0xbdcc52aa, 0xbe5fbfbf, 0xbe88aa6e, 0x3e449e3e, 0x3e65567b, 0x3d395bd0, 0x3e92f4f5, 0x3cc41bd0, 0xbdcec534, 0xbe9c5e70, 0xbd062c6e, 0xbe404755, 0xbdb19786, 0x3d34127a, 0xbd3e73e0, 0x3dad7958, 0xbda38165, 0x3e1b1bc1, 0xbd8d97e6, 0x3ef2cac3, 0xbdccf1e4, 0xbdb48c24, 0xbdebc610, 0xbdec16fd, 0xbd86d358, 0xbe826ea4, 0x3def47da, 0x3eed4f30, 0x3e67e757, 0x3d913379, 0x3e70e0a8, 0xbe585c38, 0xbe8c4ad1, 0x3f016529, 0x3e90666b, 0xbeb8ad18, 0xbe6edb22, 0x3e7a01e4, 0x3c9d8e6b, 0xbed1462a, 0xbd6186c1, 0x3e8fbf51, 0x3e240e29, 0x3eba58e5, 0x3f10503a, 0xbe76192f, 0xbc3160ac, 0xbea81c07, 0x3df0f44f, 0x3e5bb0bd, 0x3b534a12, 0xbd93514a, 0x3e208965, 0x3e8215be, 0x3f165190, 0xbe07ef99, 0xbe6bac3a, 0x3e5c6b31, 0x3e909a4d, 0xbe9b090a, 0x3e17d5b0, 0xbc93ecb8, 0xbd5c6a5f, 0x3e21fe4f, 0xbda39d77, 0xbde57e28, 0x3e956701, 0xbef7d2d8, 0x3d48d844, 0xbe6c7436, 0x3ea6443c, 0x3d9fe004, 0xbeb6320e, 0x3d110eda, 0x3e47ca71, 0x3db45daa, 0xbf1953fe, 0xbf23c72a, 0x3f23873b, 0xbf2a323f, 0xbe9db1f6, 0xbe8b014f, 0x3e8c56fd, 0x3c19609a, 0x3de70660, 0x3f2a6e11, 0xbea3a9f1, 0x3eead704, 0x3f08a508, 0x3eba9924, 0xbe1017f7, 0x3de97eb7, 0xbd29e7be, 0xbe2a5646, 0xbdf586cd, 0x3eeaf7e4, 0xbcab5f5b, 0x3eb82b14, 0x3d1a099f, 0x3ce67ae6, 0xbf417a17, 0x3e1dc3b8, 0xbe3c1f52, 0x3e6f1e18, 0x3e8e9b68, 0xbdb2af49, 0x3da38254, 0xbea75160, 0x3f0f91b5, 0xbeb1784c, 0x3e2f867d, 0xbe7de72b, 0x3e7adace, 0x3e5720d4, 0x3e10961e, 0x3ddc240b, 0xbe2318ef, 0x3e32ac2b, 0x3e8e1959, 0xbe6fae28, 0x3ea34dee, 0x3ea540d4, 0xbea9a338, 0xbc63e542, 0x3b491747, 0x3e3c631b, 0xbdaf5232, 0x3e9d718a, 0x3e101ff9, 0x3d204597, 0x3d18b451, 0x3d66e9f6, 0xbe4c565e, 0x3e1594e7, 0xbdd28674, 0x3d7b0bf4, 0xbe2567f3, 0xbed5da1c, 0x3ecb919e, 0xbe8cfe2c, 0x3e10be5a, 0xbdb9c09b, 0x3e3037ca, 0xbe75d6f0, 0xbe3c649a, 0x3d518333, 0xbe46a45a, 0x3dc8ae7c, 0xbe092610, 0x3f01eea0, 0xbe8bb441, 0x3ea5eef8, 0xbc2e57f3, 0x3e21658b, 0x3e38e1fe, 0x3ea4753e, 0xbe7e055e, 0xbe11ffda, 0x3ec53cd7, 0x3e6599d9, 0xbea4aca1, 0xbe80ccab, 0xbf259bd8, 0xbecc63ed, 0x3d3b1c9d, 0xbee17a6a, 0xbdc22d30, 0xbc50f176, 0xbd762b66, 0xbee7eb4d, 0xbe137422, 0xbe9f5c9f, 0x3d8d8aeb, 0xbe32b367, 0x3c9524ba, 0x3ebc1ccf, 0xbd162f89, 0x3ed50066, 0xbf23fec7, 0x3ebd1b83, 0xbe2f5842, 0x3eaa306f, 0x3e5ed520, 0xbdddf001, 0xbdbf5b05, 0xbf192f4c, 0x3e9dd947, 0xbf374da4, 0x3f1368ef, 0xbf2a2544, 0x3d3fe70f, 0xbbf2d8ff, 0x3e8ed9a8, 0x3ebdf356, 0xbe43d5ff, 0x3eb3169e, 0xbda9338c, 0x3dbd3f28, 0x3b12dac0, 0xbdc29816, 0x3e80ef64, 0x3edd0518, 0x3e49a721, 0x3d04d847, 0xbe16a7c5, 0xbe7813cd, 0x3eb3e696, 0xbbe085fa, 0xbeeca31a, 0xbdfe3043, 0x3e303af2, 0xbe78577c, 0xbe9a2b69, 0xbe8a6d5d, 0xbf04175c, 0xbe82143a, 0xbe8ab2b2, 0x3e6c5884, 0xbb52384e, 0x3e9d39f8, 0x3ec58ea7, 0xbd0c1641, 0x3e97059b, 0xbd91e8b6, 0xbeee9f39, 0xbec06fb5, 0xbeaf7fc8, 0xbe1b33bb, 0x3e09f602, 0x3e79613a, 0x3d979f46, 0x3dc7acc1, 0x3e900e1f, 0xbe056e67, 0xbd221983, 0x3d183fe7, 0xbd14d86c, 0x3eec8d4e, 0x3e6dc63c, 0x3e329c90, 0x3dcee45a, 0xbdc27944, 0x3ee1be39, 0xbe523435, 0xbe979448, 0xbde9f231, 0xbe9af2cf, 0xbee5addd, 0x3e9b6a7b, 0x3e57b8d4, 0x3da8a4ea, 0xbee13f9f, 0xbebc1365, 0x3edd1a1b, 0x3ec3d70a, 0x3f038a97, 0x3f105f8f, 0xbc2d43e4, 0x3d13ce29, 0x3e31f2ed, 0x3e7c0b4a, 0x3e877b2d, 0xbe9d3744, 0xbdca6eb1, 0xbed03726, 0xbe257ea6, 0xbd2da53f, 0x3d361377, 0xbe612273, 0x3ef27c61, 0x3eb77860, 0xbd761e89, 0x3dc111cc, 0xbde632ba, 0x3cba5474, 0xbf074b09, 0xbdddb07a, 0x3df140b6, 0xbe624eb7, 0x3e8c9f81, 0x3e96edd6, 0x3ec5c9e8, 0xbeb9b475, 0x3eb85a10, 0xbcaf7b41, 0x3dbd912e, 0xbd5d6413, 0xbe9a1508, 0xbcb505e9, 0xbf28909a, 0x3dbb878f, 0x3e9754b0, 0xbc956695, 0x3de59a75, 0x3e0a65a7, 0x3d924c1f, 0xbf0b40ff, 0x3d56cc40, 0x3d83c7ca, 0x3e54f93f, 0xbded89b9, 0xbdd2bd74, 0xbe3689e9, 0xbca381f4, 0x3d8e3ebc, 0x3cf16aee, 0x3cebaf0e, 0x3df9c2e2, 0xbe83ba44, 0x3eefbdee, 0xbf0e070a, 0x3e81188e, 0x3eb5e7f9, 0x3e23a881, 0xbe8960f2, 0xbe1d0de3, 0x3d165d13, 0x3f1a2341, 0x3ec3e91b, 0xbeb020f2, 0xbbb8184f, 0x3f1be68f, 0xbf04aa9c, 0x3c6dde87, 0xbd90f759, 0xbe08f667, 0xbbefec56, 0xbd65ef62, 0xbe521be8, 0xbdf10eb8, 0x3d16cdca, 0x3e20d433, 0x3d6e4abf, 0x3e6741fe, 0xbe2b75c9, 0xbe21ee8d, 0xbea7faf0, 0xbec33ff4, 0xbd59aa1e, 0x3dba7ac7, 0xbe9b4d75, 0x3dc692d3, 0xbdb92e2e, 0x3ea079c6, 0x3e6a8fde, 0xbe2d5f58, 0xbe01605e, 0xbe2a6a29, 0xbd7b202f, 0x3e89063f, 0x3e2d1437, 0x3f065650, 0xbd8843bf, 0xbe881fb6, 0x3e97a150, 0xbd971835, 0x3e43c062, 0xbea81a01, 0xbc6e2843, 0x3e21e2b6, 0xbecbd032, 0xbe428eb0, 0x3e920a66, 0xbd3b825f, 0x3d6a2046, 0x3df4c9ea, 0xbc9f692e, 0xbe9754e7, 0xbe5f59e0, 0xbe40e255, 0x3ebe1986, 0x3d9f2135, 0xbd679c55, 0x3e3fb105, 0xbe043d8c, 0x3ea933dd, 0xbe5a4d86, 0xbc90ea08, 0xbf0c7fe5, 0xbe4fdc73, 0xbf1c93f5, 0x3ef6b2fc, 0x3cadc5cb, 0x3e90bfa3, 0x3eb145c4, 0x3e2e0e92, 0xbe1d306c, 0x3e74b524, 0xbeb1c354, 0xbdbfb7f5, 0x3ee88e6a, 0x3f3ef77f, 0x3e521d05, 0xbccb5b64, 0xbe8a70fc, 0x3e805d60, 0x3e9ff03b, 0x3f1a5a8d, 0xbe410ff5, 0x3dda66a5, 0xbda13544, 0x3e7e154f, 0xbea6a780, 0xbe9c9f10, 0xbd31a1c6, 0x3c2f11fb, 0x3e331224, 0x3e3dd8f4, 0xbf08e3bc, 0x3d45feb5, 0xbc99c5cd, 0xbe47be5c, 0x3db19ea7, 0xbe2c2244, 0xbea14904, 0xbeed2b62, 0x3e958120, 0xbe7ed430, 0xbeda03ea, 0xbdf55d45, 0x3ec4c3f9, 0xbe73587e, 0x3dc48e03, 0x3e872d11, 0xbe24be16, 0x3e002553, 0xbedd6dcd, 0xbf05967c, 0xbe5acbc6, 0xbd6dd0c6, 0x3d5cac6e, 0x3d08f81e, 0x3dbf3b73, 0x3e8559c9, 0xbf005f8e, 0xbd39418d, 0xbf5d65a3, 0x3ea2994c, 0x3d014bf9, 0x3d9e5405, 0x3e4b7a36, 0xbeac64d4, 0xbea833c8, 0x3ecf63f4, 0xbe88d442, 0xbc809102, 0xbd975f63, 0x3e797d3c, 0x3d45bdfc, 0xbecd900e, 0xbd832ce6, 0xbec8f31a, 0x3ea9d4e6, 0xbe555cf3, 0xbbcb1869, 0x3e51f931, 0xbe9b7149, 0xbe894866, 0x3d0be584, 0x3d759ee0, 0xbee53264, 0xbde194b7, 0x3f00550a, 0x3d07dd83, 0x3e70d1e6, 0xbeb6cdbb, 0xbeb7ca33, 0x3e135b39, 0x3b9ea975, 0x3e1c7be4, 0xbf01ceff, 0xbe462fd2, 0xbd88d835, 0x3a3ae5aa, 0x3d31af2c, 0xbe50a9c3, 0x3dde514a, 0x3ca1d90a, 0xbea1d623, 0x3e7ce424, 0x3eeee78c, 0xbdb75ab0, 0xbe0d2725, 0xbed4fd04, 0x3d9505f1, 0x3e5815ce, 0x3e7b39ab, 0xbe814004, 0x3efe2017, 0x3ba2fe9a, 0xbee394c0, 0xbdf86de6, 0x3e628cb4, 0xbd72a25c, 0x3e2d01a6, 0xbd936e53, 0xbe86b8a9, 0xbdc6231c, 0x3c0b7801, 0xbd69b69b, 0x3dc0115e, 0x3dcb8930, 0xbd1d3790, 0x3d744be3, 0x3d64919d, 0x3ec0ad73, 0xbc3c860f, 0xbe0e34ae, 0xbced0e17, 0xbe35cff0, 0xbddd15a2, 0x3e501045, 0xbda2b1c8, 0xbbab2395, 0x3f01a935, 0x3ddf95ee, 0x3e1f9659, 0x3ed81dba, 0xbdf4fe1d, 0x3bc03230, 0xbe8517e1, 0x3ea195a3, 0x3e0e8742, 0xbe1cc897, 0x3c7ec29f, 0xbe0cd592, 0x3e51e8c4, 0x3baf3cf3, 0x3ea6f465, 0xbdc119c9, 0xbd5846b3, 0xbf01947e, 0x3da7988f, 0xbe0f70a3, 0xbdb615d1, 0x3d975cd8, 0x3ec6f3a3, 0x3e7710be, 0xbe373d89, 0x3d5af1d2, 0x3e94d9a9, 0x3ce0df9c, 0x3d6f3438, 0xbe9bd34a, 0xbd8ed6c2, 0xbe8956fb, 0x3dad0942, 0x3df2d2f8, 0x3e102373, 0xbec9cc30, 0x3d9ad49c, 0xbd0b5fc3, 0xbd5f0fb1, 0x3ec1e983, 0xbd6a9ddd, 0xbea5e6ac, 0xbdac316b, 0x3d7f40ff, 0x3ef04aab, 0x3d601fc2, 0xbf0ecbaf, 0x3ee18235, 0x3e8e8b5c, 0x3e2e2c5c, 0x3e7e75a8, 0xbec564ee, 0x3ab6da48, 0x3ad343c4, 0x3dfc3bf9, 0x3eafd3e0, 0xbe216d1b, 0x3dee5020, 0x3e950209, 0x3f30c613, 0x3d64aca0, 0x3ad4b0cb, 0xbdadf6a8, 0x3e2d6266, 0xbd36bcf9, 0xbebd2163, 0xbee0de97, 0x3cf353c0, 0x3e59d968, 0x3ebc118f, 0x3eabd616, 0xbdc56e88, 0x3e87d778, 0xbeb655e5, 0xbe3ff5c8, 0x3e671409, 0x3ece2146, 0x3de8fc30, 0xbe9aceb6, 0x3e646bc3, 0xbf09640a, 0x3e8d4f72, 0x3e34695c, 0xbe984ef0, 0x3ea74c2f, 0xbd79edfb, 0xbe4af000, 0xbe1c17d8, 0xbd8c89a7, 0x3e2898c1, 0xbe9da9d9, 0xbe9c031a, 0xbc58966e, 0x3e00614d, 0xbe1536ca, 0x3cbd4586, 0xbd2591d9, 0x3dc0eb39, 0x3eae3429, 0x3e25e559, 0xbd36536e, 0xbe1d61c3, 0xbd998e8b, 0xbe98497f, 0xbe7d39f5, 0x3eb62934, 0x3e41a0ea, 0xbea06f96, 0xbe8f1d20, 0x3e4aa80c, 0x3d8c2178, 0x3e6c9553, 0x3dd6a386, 0xbda2121c, 0xbf124bee, 0xbd94834f, 0x3e0ba00d, 0x3e6de024, 0xbe3f8bba, 0xbed34bca, 0xbd428d65, 0xbdcfabe1, 0x3ebe043a, 0xbe1ec472, 0x3e05a515, 0x3ced4cd4, 0x3dc4043e, 0x3d85daae, 0xbd4c5629, 0xbe6df841, 0xbe466e8b, 0x3b7cf136, 0xbe1b3709, 0xbe118fe2, 0xbe8dc3d5, 0xbcdf9f32, 0xbe9de9b8, 0xbe88a203, 0xbe159e14, 0x3f4c7b16, 0x3e95bed0, 0x3e6809af, 0x3c89c916, 0xbe0278ee, 0xbe1e67ff, 0x3e81ceb2, 0x3e3f7827, 0x3d36577c, 0xbe9c31e7, 0x3ea70b64, 0x3e6e9922, 0xbd9bd5f8, 0x3cf8cd98, 0xbef6a8c1, 0xbee5d74e, 0x3d6f9356, 0x3e44893a, 0x3f10173e, 0x3e14fb9d, 0x3e8a4229, 0x3f0d3730, 0x3eb31aaf, 0xbdae326e, 0xbd856f9e, 0xbe302700, 0xbdf70745, 0xbe950ab8, 0xbe98ee18, 0xbd8b046e, 0x3e5f803e, 0x3e8d46c3, 0xbe0e5ae3, 0xbc91a895, 0xbe10fa8c, 0x3c0db940, 0x3e6b973a, 0xbe93512e, 0x3d1fd1d7, 0xbec83785, 0x3e8e3a45, 0x3e59c147, 0x3dae48d2, 0x3e321961, 0x3ead3f61, 0x3c94ac37, 0xbece179e, 0xbe204e1a, 0x3f2ce660, 0x3d51ad83, 0x3ea9f729, 0xbe9023c2, 0xbe579910, 0xbd9c3986, 0x3e0ca582, 0xbee5597f, 0x3d27d977, 0x3bfbda94, 0xbdd3acc8, 0xbdca4898, 0xbef0e66c, 0x3e73d69b, 0xbdbe25df, 0x3d2a0be7, 0xbef896f9, 0xbda2b796, 0x3e625f7e, 0x3e07ad2b, 0xbedb6a1d, 0xbe463990, 0x3ee33d49, 0xbf800000, 0x3e43b4f8, 0xbd2db90e, 0x3d1a1eb2, 0x3eb5ea96, 0xbe8c0f00, 0x3d15ba32, 0xbeb50907, 0x3e92f61f, 0xbefc0e47, 0x3e72c0fb, 0x3c869065, 0x3d305840, 0xbe19f511, 0x3e83456b, 0x3f1ce235, 0xbc214a4b, 0xbf0af893, 0x3cc54280, 0x3f03a925, 0xbea97b86, 0x3e1a8f17, 0x3ee6df4f, 0x3ecc671a, 0x3e0d5325, 0x3ecc187e, 0x3cf2f240, 0x3cf2eba4, 0x3e5cee93, 0xbd944180, 0xbead4334, 0xbe746a22, 0x3dd76b19, 0xbe63fb71, 0xbe3f41dd, 0xbc97ce86, 0xbba629b6, 0xbd6cb5bd, 0xbd571142, 0xbec6e383, 0xbcc10760, 0x3e67cb4f, 0x3e5afa76, 0xbc8376c4, 0x3d3d16e9, 0xbc91853c, 0x3dfd5cf8, 0xbc879da0, 0x3ea49747, 0xbe0caa1c, 0xbe9d44a3, 0xbd723f1a, 0xbdf095d6, 0xbe9d9d9d, 0x3c5b0bb1, 0x3d95c235, 0xbd7f02b0, 0xbe29423e, 0x3e898f50, 0xbe227227, 0x3d966023, 0x3e06b3b8, 0xbd95f7db, 0x3c833bdb, 0x3f64df98, 0x3e0de1a5, 0xbe49e625, 0xbd87588f, 0x3e8b7146, 0xbeb1d7ee, 0x3c932546, 0x3e7997bf, 0x3e010994, 0xbe6b402c, 0x3c9b9990, 0x3ed6b2a8, 0x3e9f5ca6, 0xbe42099f, 0x3e78b2b5, 0xbf1a1774, 0xbe6ff709, 0xbd6e4f72, 0x3d82b2aa, 0x3d07a370, 0xbe79d45b, 0x3e559d0a, 0xbe21e2e4, 0xbc900a21, 0xbe2e782c, 0xbe85e7c6, 0x3f1dbf9a, 0x3c399cb1, 0x3de3aa51, 0xbedc09f1, 0xbee70fb7, 0xbe8e3ba8, 0x3d86c4e2, 0xbe9748bc, 0x3dd670c8, 0x3d49080a, 0x3e7f2471, 0x3e8d1292, 0xbb151704, 0xbe11790c, 0xbcd939e5, 0xbe21ef5f, 0xbeaf200b, 0xbdc7e375, 0x3f15b89e, 0xbe87492e, 0xbe99dc6a, 0x3dd7ed6e, 0xbb0092ab, 0x3ed76bdf, 0xbe877551, 0xbd1964a7, 0xbe78bfca, 0x3cc9e5e4, 0x3ea4e99f, 0x3edeabf2, 0x3ed69403, 0x3e0c8c56, 0xbe239f92, 0xbdc1baa9, 0x3e99c878, 0xbee52ddb, 0x3ead7420, 0xbea82d7f, 0x3e24628c, 0x3d87ae5e, 0x3e508371, 0x3f2e9375, 0x3c25e9a4, 0x3e2d2d69, 0xbe5c5792, 0x3e4af375, 0xbe1424b3, 0xbc66eae9, 0xbf06f03c, 0x3e875c85, 0xbeee7822, 0xbdda8494, 0x3bc31d55, 0x3e58a38a, 0x3ea82914, 0xbea97065, 0x3ee50802, 0x3ec55a6a, 0x3e375536, 0x3eb28e5d, 0x3ee195e2, 0xbeaaed49, 0x3d2fb7da, 0x3f1a676f, 0x3da93b65, 0x3f192729, 0xbdce5130, 0xbe9f94f6, 0x3e41b009, 0x3d11d22b, 0x3d82f65c, 0x3d99865a, 0xbf0b5f56, 0x3dbfaef2, 0x3f17f2e0, 0xbe5ba344, 0x3d259cd9, 0x3f180c6c, 0xbdd86475, 0x3e0ad766, 0xbdca05db, 0xbe6307bd, 0xbd63441c, 0x3dc228d7, 0xbe6c4b3d, 0x3e185f32, 0x3d8886d7, 0xbe8cd39e, 0x3e8cde91, 0x3e51bb25, 0xbe13690c, 0x3e72abd4, 0xbd9099b9, 0x3ebd6441, 0xbe0f22ac, 0xbe09483e, 0xbd039fd5, 0xbe654bb0, 0x3eafe020, 0x3e797434, 0xbccd6682, 0x3e0bf54f, 0xbf067ea8, 0xbdd28da5, 0xbee378f1, 0x3e65e0bf, 0xbe61d6df, 0x3d92e5a6, 0xbf04edf0, 0xbee1d463, 0xbefcca0c, 0x3e6f95eb, 0x3e52c4ea, 0xbf067687, 0x3e86577f, 0x3e678ca9, 0x3da725fe, 0xbdc47e78, 0xbda72566, 0xbedb7200, 0xbeafbe32, 0x3d9c887f, 0xbe079d13, 0x3ea22625, 0x3dbf72b4, 0xbef67a97, 0xbda8271f, 0xbe2d213d, 0xbdf58f4b, 0x3ef1b673, 0x3ee72068, 0xbd985c05, 0xbe70fcb9, 0x3e839620, 0xbd94b20e, 0xbf32487c, 0xbe69bef7, 0x3e2752e8, 0x3ef1e482, 0x3e214435, 0xbdba509b, 0xbeca3867, 0x3d878cf5, 0xbeb9b95f, 0xbeb08e62, 0xbecd9bc7, 0xbee115bd, 0x3e5b4c50, 0xbe6a043f, 0x3e9a28dc, 0x3c8fc6fd, 0x3d3ec950, 0xbe8d7260, 0x3e37f830, 0x3d179de9, 0x3e8302ac, 0xbe2a88d6, 0xbef0c952, 0x3e999200, 0x3da18afe, 0xbe07d7b3, 0xbe6dbd2f, 0xbeea0243, 0xbe23dc11, 0x3eab8847, 0x3df844a2, 0xbe98f8dd, 0x3c207c34, 0x3f1128a5, 0xbe71da02, 0x3eec3422, 0x3f583caf, 0xbb9b2580, 0x3e9fb8bc, 0xbd644bc5, 0xbd87d085, 0x3d874630, 0xbe270a41, 0x3d7a3c01, 0x3e46708c, 0xbf05c0d8, 0x3eab488e, 0xbcc71fa4, 0xbd9a4bef, 0x3ea775e4, 0xbeda9f05, 0xbe04673d, 0x3e6e77b6, 0xbde8dc89, 0xbdd85bfe, 0x3d8ae670, 0xbd294993, 0x3e9eedff, 0x3e47e56d, 0x3e4df482, 0xbe8ed5d0, 0xbe34be3c, 0x3d9f2a42, 0x3e497489, 0xbd24167e, 0xbdf5a89d, 0xbf0fbee9, 0x3f3c1f47, 0x3f800000, 0xbefa79c6 }; static const uint32_t in_uptriangular_dpo[3111] = { 0x3f000000, 0x3f5db3d7, 0x3e93cd3a, 0x0, 0x3f5105ec, 0x3f3b70da, 0xbe838485, 0x3e9927dd, 0x0, 0x3f3d6e02, 0x3d7e0c28, 0x0, 0x0, 0x3f5ebdd4, 0x3f65057d, 0x3f3a3698, 0x3f0c57ec, 0x3f364419, 0x0, 0x3e4832d6, 0x3d9abf41, 0xbda04cbf, 0x0, 0x0, 0x3eaf479d, 0xbecc3ece, 0x0, 0x0, 0x0, 0x3e5f2388, 0x3f9c4f91, 0x3f9f683c, 0x3fad0ddb, 0x3f21af45, 0x3f719064, 0x3f547367, 0x3ef5d432, 0x0, 0x3f67bf66, 0x3f043a7f, 0x3eccaabe, 0x3dc2e3bd, 0x3f3a6088, 0x3f16fd2f, 0x0, 0x0, 0x3ed2b428, 0xbe7861a5, 0x3ee2a741, 0x3d054f79, 0xbe0b0773, 0x0, 0x0, 0x0, 0x3ef0ae64, 0x3c980235, 0x3d0f1f51, 0x3e159041, 0x0, 0x0, 0x0, 0x0, 0x3efff599, 0xbebde5f7, 0xbe0aa01d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e1e6d26, 0xbe16a250, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3dcb7cf1, 0x3f9d0810, 0x3f811ca1, 0x3faf7159, 0x3f1ca24a, 0x3f608719, 0x3f123c02, 0x3f635234, 0x3f5e424e, 0x0, 0x3f2946e3, 0x3f40c62e, 0x3f009951, 0x3e937279, 0x3f214e3f, 0x3f05c177, 0xbe2da5cc, 0x0, 0x0, 0x3e9f91bc, 0xbd28bf53, 0x3d929a62, 0xbea85eb5, 0x3e7fc645, 0xbdb2993f, 0x0, 0x0, 0x0, 0x3e9901b2, 0x3da2f76c, 0xbe176f02, 0x3d5ecfe1, 0x3e427c12, 0x0, 0x0, 0x0, 0x0, 0x3f187ab6, 0x3edabd60, 0xbdab63bb, 0x3d1d7395, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e24ecc8, 0xbcfb9056, 0x3e4e9865, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ecf5956, 0x3b897b82, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ebc9108, 0x3f7d707b, 0x3fab75f4, 0x3f6de464, 0x3fa7c175, 0x3f859b0b, 0x3f949b15, 0x3f799ffb, 0x3fa3eccb, 0x3fa02ee8, 0x0, 0x3f428de4, 0x3ee41605, 0x3f05ba69, 0x3e80e72c, 0x3ee760df, 0x3ec769c2, 0x3efe3329, 0x3f09d80b, 0x0, 0x0, 0x3eead8e7, 0x3e016506, 0x3cb02b8d, 0x3b878e92, 0xbe3555b4, 0xbeac6ec5, 0xbcf12f29, 0x0, 0x0, 0x0, 0x3f2a057b, 0x3e253296, 0xbb6180aa, 0x3cd51530, 0xbe88c951, 0x3e3ce591, 0x0, 0x0, 0x0, 0x0, 0x3ec7bc5f, 0xbed32166, 0xbea98cc9, 0xbdf8b671, 0xbd96bfa5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ea31834, 0xbebf9aa9, 0x3d15ea8e, 0xbe8a9a04, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eff897b, 0x3d3a081a, 0xbe3f6faf, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e53607c, 0x3eb02902, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e8335c8, 0x3fdd4638, 0x3f6b7920, 0x3fac4103, 0x3f638af1, 0x3faa0807, 0x3f5a921a, 0x3faab41f, 0x3fb28187, 0x3fe9916f, 0x3f82aaf8, 0x3f4f3829, 0x3f8e4d5e, 0x3facee7c, 0x3fbe0f69, 0x3f7320ec, 0x0, 0x3f8475de, 0x3e8953db, 0x3e173cb7, 0x3ed37a97, 0x3f0ac744, 0x3f08298a, 0x3f625399, 0x3f5345fd, 0x3ec08a03, 0x3ec42626, 0x3d4df680, 0x3f0e3808, 0x3dac65d3, 0xbd42aa76, 0x0, 0x0, 0x3f76742a, 0x3f26fb3e, 0x3dd1cbf5, 0x3ec52941, 0x3e0cc863, 0x3eb6f0e2, 0xbe1ae49d, 0x3ef42ab2, 0xbca9e043, 0x3f104ac4, 0x3dc6ee07, 0xbe7580b5, 0x3efe9556, 0x0, 0x0, 0x0, 0x3f3ffd4d, 0x3ddb6a65, 0xbe35a7c2, 0xbca0d200, 0x3e52440f, 0x3e395ab4, 0x3e2dfa36, 0x3eab1feb, 0x3e8845fc, 0x3ee5fd75, 0xbe1db6e4, 0x3ef5b967, 0x0, 0x0, 0x0, 0x0, 0x3f628013, 0xbe08ff74, 0xbdb16315, 0x3eeda6c8, 0xbc87a6cb, 0xbd80e2c1, 0x3ce52d21, 0x3ec27e58, 0xbe48c053, 0x3e78de12, 0xbe687385, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f2f479d, 0xbea358b5, 0x3e94796e, 0x3d723d17, 0xbda9153b, 0xbd842df9, 0x3d149770, 0x3d8d1983, 0x3edd6774, 0xbd784367, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f2377d1, 0x3e26ef3a, 0x3ccf5733, 0x3d52024a, 0x3eac2bd0, 0x3ea33686, 0x3e8419f2, 0xbda97022, 0x3d292448, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f084cf8, 0xbd639284, 0x3e81f5b5, 0x3eaefe3c, 0x3e8801bd, 0xbda8bfdf, 0x3e4133d6, 0xbbe43c46, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f02e0d6, 0xbdc42fd2, 0x3c72177f, 0x3de24c62, 0xbe4056a2, 0x3e8f80ed, 0x3ecc3c5c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1d4bad, 0x3ec2be32, 0x3d8cae81, 0x3e5e65c8, 0x3eb41183, 0x3de49328, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e61b057, 0xbd1f760c, 0x3c505840, 0x3d2cf06c, 0x3e0e3af1, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f0009ae, 0xbca63684, 0xbc0dcf9f, 0xbd7a262f, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ec4ba9e, 0xbd4a2fbb, 0x3bcebee0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e59466b, 0xbd85da9a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3d2f7d9e, 0x3e800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eb504f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eddb3d7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f000000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f0f1bbd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1cc471, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f2953fd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f3504f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f400000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4a62c2, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f544395, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f5db3d7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f66c15a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6f7751, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f77def6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x3fc66151, 0x3f9c6eca, 0x3f72f3d9, 0x3f99c39f, 0x3fa45b71, 0x3fc08290, 0x3fb171d3, 0x3fa7eb8e, 0x3f91e5da, 0x3f28b40e, 0x3f89844b, 0x3f9f6f60, 0x3f629747, 0x3f9fde05, 0x3f91da76, 0x3f205c2d, 0x3fc0f458, 0x0, 0x3f912485, 0x3eba368c, 0x3f2c588b, 0x3ea897d9, 0x3f1dfa41, 0x3ed63c4c, 0x3f6d7fef, 0x3f734e7a, 0x3f233daf, 0x3f2f3cf2, 0x3f1f6e0c, 0x3ec88672, 0x3f54fc87, 0x3f5214db, 0x3f7b6b31, 0x3f305ef3, 0x0, 0x0, 0x3f66aee6, 0x3ecaae9c, 0x3e93ef0b, 0x3e817b21, 0x3edcb5b1, 0x3edc4a4e, 0x3e87c33a, 0x3ea1e21c, 0x3f0d07d5, 0x3ed5e753, 0x3ed7c0f2, 0x3ec872ab, 0x3e832618, 0x3e28d4db, 0x3ec418da, 0x0, 0x0, 0x0, 0x3f8efd6a, 0x3ed38e5e, 0x3e4f02d0, 0x3ebbdbf5, 0x3ed12f98, 0x3f5a2622, 0x3efada62, 0x3de866fe, 0x3e00b58a, 0xbe3284db, 0x3ecd5456, 0x3e13423e, 0x3ecc9368, 0x3eec5aae, 0x0, 0x0, 0x0, 0x0, 0x3f2474e2, 0xbdffd971, 0x3eb37eb4, 0x3dc009cd, 0x3e839b58, 0x3cee0e88, 0xbe6b8030, 0xbd3bc139, 0x3e8076a1, 0x3e621ad5, 0x3f31a590, 0x3e52fa09, 0x3e331120, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f2b8633, 0x3d258cb4, 0xbeb7daa4, 0xbe5464df, 0x3db934d0, 0xbeaa6179, 0x3dbcf436, 0xbd158236, 0xbe41ffab, 0xbdf00907, 0xbdceb25b, 0x3e2114b9, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f47e3e5, 0xbeb17800, 0x3d72f515, 0x3e1669d1, 0x3f1d422a, 0x3ed02365, 0xbc7d7fc8, 0x3e9be209, 0xbdb2a17c, 0xbe7c437c, 0xbca5377f, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f2989d6, 0x3e961ec8, 0x3c2e3d62, 0x3eded9bc, 0x3d170cb8, 0x3e02ad65, 0x3f2b3489, 0x3f0d5ad3, 0x3db2c001, 0x3eb69da8, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3efb9bde, 0xbec07903, 0xbe6afe9a, 0xbe9f9663, 0xbe88fdc9, 0xbd90bbec, 0xbe3b4f02, 0xbebd85e3, 0x3e008ecd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1c8887, 0x3ca651c4, 0x3e0137b8, 0x3da428c2, 0x3e25833f, 0xbdd6c2d0, 0x3e9abcf9, 0xbe4db979, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1869a5, 0x3e0fc8cc, 0x3e158939, 0x3e3718ff, 0x3ec28036, 0x3b6f40fa, 0xbc674010, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f533f36, 0xbe18c19e, 0xbe543e51, 0x3a90e344, 0xbcc5f309, 0x3ee69cda, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3edcb926, 0x3dd89711, 0xbc213402, 0xbdb08688, 0x3dbfb34f, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eedad90, 0xbe6b1116, 0x3e634aa3, 0x3ce60b73, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e7b822d, 0xbcd33ac4, 0xbbb5564e, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f0406f9, 0xbd0b6e81, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e17f757, 0x3ffed00c, 0x3fd17cd5, 0x40023062, 0x3fde73b7, 0x3fa7bce4, 0x3fde53f2, 0x3fcf000c, 0x3f984f0b, 0x3fa7bebb, 0x3fbcc768, 0x3fdcd9e8, 0x3fd754f7, 0x3fd01a6e, 0x3fda05ff, 0x3fa733f3, 0x3fdf9f18, 0x3ffd99ba, 0x3facfbe7, 0x3faddd7c, 0x4003bb43, 0x3facec69, 0x3fcc3179, 0x3fb301be, 0x3fd30b04, 0x3fe6958f, 0x3fd1922c, 0x3fb7a845, 0x3fb8e880, 0x3fe5880a, 0x3fc583ec, 0x3fb82540, 0x3fe0be31, 0x0, 0x3fc40447, 0x3f69519c, 0x3f72ace5, 0x3f1477bc, 0x3f8079b1, 0x3f9d8d20, 0x3db1fea7, 0x3fa7575a, 0x3e9024a3, 0x3f768946, 0x3f082a0b, 0x3f4cf231, 0x3f6771a0, 0x3f1d1042, 0x3f1d4800, 0x3f7e6fb2, 0x3f47586e, 0x3f9cd3ce, 0x3ed0e300, 0x3f2b8a20, 0x3f022e4a, 0x3e8d19e9, 0x3f2a9af8, 0x3f9d887e, 0x3f640eb1, 0x3f5770f0, 0x3eebce56, 0x3f1fdf8c, 0x3f76f355, 0x3f5eb20d, 0x3f81548a, 0x0, 0x0, 0x3fc2c6c7, 0x3f092a3b, 0x3ee96652, 0x3f5bab55, 0x3f4cea61, 0x3ee4f662, 0x3e46c933, 0x3f03269b, 0x3f11e8f3, 0x3f88b972, 0x3ecfb323, 0x3eb9ea2c, 0x3f30e33b, 0x3f1fece6, 0x3f0f3b87, 0x3ecae13e, 0x3ee5875d, 0x3f031c42, 0x3f562f52, 0x3e648cdf, 0x3f24aa50, 0x3d7e078d, 0x3f942bc5, 0x3f1a6aae, 0x3e9f1b20, 0x3f0a2ab2, 0x3f4561d8, 0x3f379767, 0x3efebc0c, 0x3f29b060, 0x0, 0x0, 0x0, 0x3f9f52f7, 0x3e2b093e, 0x3d7e5039, 0x3e80bfcc, 0x3e8a414d, 0x3e44755c, 0x3f42a080, 0x3d834623, 0x3ec00e29, 0x3ba33586, 0x3e3917a6, 0xbdd776b5, 0x3f0d6a51, 0x3d7fee6f, 0x3ddf2103, 0x3e248c15, 0x3f109e7a, 0x3de743af, 0x3f269697, 0x3e31f7f3, 0x3f2dcf40, 0x3da7cd2b, 0x3e81a394, 0x3dd47221, 0x3ee7860b, 0x3e99ea6f, 0x3dfc5afc, 0x3e4abbd9, 0x3e68e017, 0x0, 0x0, 0x0, 0x0, 0x3fa98274, 0x3f261e96, 0x3eebda8c, 0x3f459096, 0x3ea4b71e, 0x3f1229ab, 0xbe320c0d, 0x3e6211e4, 0x3ea69247, 0x3e9691f7, 0x3ef5ad97, 0xbd765a7f, 0x3de7a1aa, 0xbd68a5ce, 0x3f453193, 0x3e774141, 0x3ea1aaaa, 0x3eb8ccfa, 0x3e80be5c, 0x3ebfb78b, 0x3ef28d20, 0x3f2044ac, 0x3ec97360, 0x3f07c3bb, 0xbdcbf0d6, 0x3f682cab, 0x3f0aa8bc, 0x3f3dfdbb, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f95520c, 0x3ec99979, 0x3f0af824, 0x3e8b797f, 0x3f879838, 0x3e8640da, 0x3f08d6fe, 0x3deba617, 0x3ed31268, 0x3ea845a8, 0x3e8eeb70, 0x3b7ea369, 0x3eb620dd, 0x3e2d7a27, 0x3f014d84, 0x3f1b2da5, 0x3c645a85, 0x3e7bfe2b, 0x3eee2e8f, 0x3e84ac2f, 0x3e29c5e5, 0x3e48c3dc, 0x3ec56276, 0x3efdde26, 0x3e9231b1, 0x3ea50875, 0x3e94b3f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f81c368, 0x3e08e904, 0x3dabd6c8, 0x3e4c8c48, 0x3e8b5d0c, 0xbe63a8fa, 0x3e827ad2, 0x3ebd6d87, 0x3f24bba0, 0x3ec3d74b, 0x3d2bc6fb, 0x3e8820e0, 0x3ef2a046, 0x3edf8cd0, 0x3eab4d6c, 0x3f0e0695, 0x3dfe6726, 0x3f149fe6, 0x3ecb6b9c, 0x3e8263ba, 0x3de3873d, 0x3ea99425, 0x3caa7198, 0x3ebf488b, 0x3e48e6fa, 0x3de39e37, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f7fa105, 0xbe2152aa, 0xbda18021, 0x3e3de4b6, 0x3e8986fb, 0x3ec3efab, 0x3f194be0, 0x3ef244f1, 0x3ecbcc7e, 0x3d64b17d, 0x3ec13cc3, 0x3e051b2c, 0x3e76687f, 0xbe87e2a6, 0x3e6882e1, 0x3e8cdb69, 0x3e40f4ba, 0x3eb5499f, 0x3dec7d26, 0x3ebde9e2, 0x3e6f1147, 0x3eaa86b6, 0x3e931e90, 0x3e26f2b5, 0xbe190357, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f8132e0, 0xbcced5a8, 0x3ebd51ad, 0xbe81476a, 0x3e8ca65f, 0xbe1a8142, 0xbe425934, 0x3d9dffcf, 0x3da3e0b3, 0x3d59d9dc, 0x3e2bbb51, 0xbdc5573d, 0x3d84c64a, 0x3c61b8de, 0x3e32022b, 0x3df94fd7, 0x3e56340c, 0x3e99e3ce, 0x3ef12513, 0x3d8130d6, 0x3d1fd57d, 0xbd35737b, 0x3ec47b5f, 0x3e904fbf, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f75356d, 0x3e81ca64, 0x3e961ac9, 0xbe116fd0, 0xbe4e4b11, 0x3e9974ac, 0xbe2168df, 0xbd9c4fda, 0xbe5a1c37, 0xbe622169, 0x3e1f0d4d, 0xbd42cfa3, 0xbd4d43b7, 0x3de75f11, 0x3e4f5336, 0xbe185b4f, 0xbeb42111, 0x3cb30022, 0x3e4356fe, 0x3e74a256, 0xba78aea8, 0xbe00434d, 0x3ed4ef3d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6ba7a5, 0x3e60a3dc, 0x3d87f8df, 0x3da83152, 0x3c6614d8, 0xbe08190e, 0x3e154967, 0x3e01225a, 0x3db2613f, 0xbe3c054b, 0xbea134f9, 0xbe53ba18, 0x3c3c3ef7, 0xbe3b6992, 0xbe43fd6d, 0x3cd06a71, 0xbcbd66d0, 0xbdc396b4, 0x3e1996c6, 0x3da06f84, 0xbeadf6ab, 0xbe848e31, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f5fa451, 0x3f26b9f6, 0x3f0a14ac, 0x3e167906, 0x3d0a229c, 0xbd9e5677, 0x3e7aaf69, 0x3e4d1c1e, 0x3ecc81b3, 0xbc3d9575, 0x3b919a5b, 0x3e8cb874, 0xbe799d4e, 0x3e730c6d, 0xbdb3cea7, 0x3e5d9024, 0xbdf45454, 0x3e138086, 0x3e6a2d9e, 0xbe66ea82, 0x3d8e1940, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f348717, 0x3eeb2c85, 0x3e3fbcac, 0x3d1ef589, 0x3e285852, 0x3eeff838, 0xbcdc504a, 0xbef8a0ef, 0xbed62816, 0x3e25a656, 0x3e05faf3, 0xbe66afb9, 0x3de55016, 0x3edde5a6, 0x3e834f6f, 0xbe44d9cd, 0x3ebcc931, 0x3e6a6512, 0xbe76ea35, 0xbdf93878, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f86ccf4, 0x3eca7c36, 0x3db40187, 0x3e2294d2, 0x3ee18727, 0x3d812a54, 0x3e71921b, 0xbcfd85d5, 0x3e2379f6, 0x3c9f1372, 0x3e47d99a, 0x3d8e4a1c, 0xbce1e008, 0x3e76df67, 0x3df2a441, 0x3e57df72, 0xbdf785b0, 0x3da69860, 0x3f0e997c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f49449b, 0x3eacdd97, 0xbe93799f, 0x3d3497b2, 0xbebba39a, 0x3e815f3a, 0xbe62851f, 0x3e02d45e, 0x3dd6ba26, 0xbe084e2f, 0xbd1d7e16, 0xbed6bc1f, 0x3ed08fe6, 0xbdbb511f, 0x3e08b418, 0x3efbcc72, 0x3dd307ad, 0x3e47e307, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f30b94a, 0x3edad112, 0xbc7cd569, 0xbd5d1b5a, 0x3c9f6064, 0x3e1bc900, 0x3df6f0b7, 0x3e6d1ea0, 0xbda8dfc8, 0x3de81a83, 0xbe254da8, 0x3d2fb9d2, 0xbdab5415, 0x3eafd807, 0x3e2c97eb, 0x3ee8a413, 0xbcff24c7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f528f2e, 0xbe4623ca, 0xbdbea01d, 0xbdf8f2df, 0xbe58912c, 0x3f091655, 0xbd6f836c, 0xbd7209c7, 0x3bd81574, 0x3e4b5427, 0xbdc658d8, 0xbec698e0, 0xbc8d5878, 0xbdd1977c, 0x3e3637e3, 0xbe1d0e4a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f406dcf, 0x3ef0bd3a, 0x3e1a92ea, 0xbd97977a, 0x3ecbeb20, 0xbe91b4c0, 0x3daf3e3b, 0x3e7f68af, 0x3f1e4fb9, 0x3eb784e4, 0x3d40ff7f, 0xbf08bca4, 0xbdc246f1, 0xbde60450, 0xbe505ec4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f3d13e7, 0x3d73e74e, 0x3d4acd2f, 0xbd769583, 0xbdab98c2, 0xbe253f51, 0x3e61c6a6, 0x3bbebad8, 0x3cb98c8a, 0xbe84fabb, 0xbe983185, 0x3d78ffbd, 0xbe4b1942, 0x3c516c4a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ef0d293, 0xbc3264fb, 0xbd951e4c, 0x3e98c134, 0xbeaf18b4, 0xbe102d47, 0xbe8e6d28, 0xbcdd1392, 0xbeaaed36, 0x3e419b56, 0x3e906d7e, 0x3c1b32db, 0xbebfb6cd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f25a676, 0xbdf04e1a, 0xbc7c5055, 0xbc75fd76, 0x3dec6dab, 0xbe8c801d, 0x3d9fe26a, 0x3eb3ec66, 0x3dd42e35, 0x3c977699, 0x3eb7f8e0, 0x3b9f50f9, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f2520c9, 0xbd3c82d4, 0x3e89d61f, 0xbe24133f, 0x3e814259, 0x3e0c5697, 0x3ddde002, 0x3e3693a4, 0xbe289647, 0xbbe2881d, 0x3e32a77d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1a4db4, 0xbdb40f1f, 0xbdb0bf8c, 0xbe3bc874, 0xbe4b5028, 0x3d9b27a0, 0x3dfc6018, 0xbc02664f, 0x3c7ac888, 0x3cf347c8, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ec91cea, 0x3e9e1d23, 0x3eb6982a, 0xbacaebd0, 0x3dafd7c1, 0x3dd5c1a9, 0xbc8de41c, 0x3e074632, 0x3cc28577, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f11aa31, 0x3e8d05d8, 0xbe3b3d87, 0x3e00b1aa, 0x3e335f87, 0x3e55cf5a, 0xbcceb64b, 0x3e906a10, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e93855c, 0xbe2f5a6d, 0x3d57c6a6, 0x3e5deb5d, 0xbd66e2c9, 0x3c97665c, 0xbe1435d3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3edaad0c, 0xbe899da0, 0xbea6af52, 0x3e223add, 0xbdceb1de, 0xbe38a553, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e7f182c, 0xbd0bef14, 0xbd1ea502, 0xbd0d1509, 0xbe5ed6db, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e96f9e4, 0xbdb44bea, 0xbd991fa7, 0xbe036a23, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eb41992, 0xbdd33771, 0xbe3162b7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3db1562b, 0xbe50b8c7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3d31b0af, 0x401ab7a6, 0x40061126, 0x3fd941f9, 0x3fd74bb3, 0x3fc3c04c, 0x4001717c, 0x3fd246e3, 0x3fee673b, 0x3fc65885, 0x40068cdf, 0x3fd3a07e, 0x3fda2416, 0x4014add8, 0x3fb1120c, 0x3ffa8e56, 0x3ffa4e9a, 0x3fdb5581, 0x3fbabd7f, 0x3fdf4c09, 0x4004bb00, 0x3fcbbb9f, 0x3f8363da, 0x3fbf3e2b, 0x40038518, 0x3ff4fd67, 0x3fdd6d17, 0x40038fb1, 0x3ffe22aa, 0x3fca3b9f, 0x3fd33c8d, 0x40005364, 0x3fe6ff66, 0x3fdd4ae8, 0x0, 0x3fe80c14, 0x3ed5e08b, 0x3f304d4f, 0x3ece94f6, 0x3f19b4bb, 0x3f184b09, 0x3f1abdde, 0x3f0f73d4, 0x3f5f0d68, 0x3e8767eb, 0x3f040035, 0x3f6a5edf, 0x3e482b8f, 0x3f2f89a7, 0x3f5bf783, 0x3ead2780, 0x3f3c2e80, 0x3f262261, 0x3f701706, 0x3f4946fe, 0x3f81dacd, 0x3f298a07, 0x3f091d10, 0x3f4d98db, 0x3f8355b0, 0x3f12c6b5, 0x3f7cfe11, 0x3f1eb216, 0x3f5dd138, 0x3ee57533, 0x3eba9146, 0x3eb04174, 0x0, 0x0, 0x3f9d2a7d, 0x3f163839, 0x3edcbc07, 0x3f32ff99, 0x3ea3d6dd, 0x3f163587, 0x3ec5dc61, 0x3eac7b1b, 0x3f170e1d, 0xbd818679, 0x3ea1e6f6, 0x3e783bb3, 0x3f1d5f90, 0x3ee533cf, 0x3e4c5c87, 0x3f1d8f7c, 0x3e200e2c, 0x3ef9cdfa, 0x3e869e93, 0x3e9ef900, 0x3e3bdc80, 0x3df1e1a8, 0x3efc9456, 0x3ef6881a, 0xbd5c574f, 0x3f337c3a, 0x3ed12b35, 0x3f0887eb, 0x3ed19026, 0x3c83dfaf, 0x3f15201d, 0x0, 0x0, 0x0, 0x3f896eea, 0x3df75abf, 0x3dd7e5a8, 0xbd8e9a16, 0x3f1e383c, 0x3ebcc7e9, 0x3ef68c95, 0x3e7b7bc5, 0x3d56da0b, 0x3eedf8d1, 0x3dffd899, 0x3ef7a25a, 0x3f1cadac, 0x3ebbde25, 0x3e14e974, 0xbdd0e15c, 0x3ee22fa3, 0x3e828a03, 0x3e340578, 0x3e45dc7b, 0x3e4076ba, 0x3ede99dc, 0x3e0a89a7, 0xbe5a89cc, 0x3f27bd86, 0x3e823f19, 0x3cbbbb64, 0x3efdd8a8, 0x3edd2647, 0x3f08b381, 0x0, 0x0, 0x0, 0x0, 0x3fa40b4f, 0x3f392e5d, 0x3f0b18fc, 0x3ef23e21, 0x3f0c84ae, 0x3ed978dc, 0x3f80168d, 0x3ecba874, 0x3e464816, 0x3f1efa0c, 0x3e8b26e3, 0x3e6ef295, 0x3e60f959, 0x3e088ea2, 0x3f071e23, 0x3dbda156, 0x3ee99eb5, 0x3ec843e9, 0x3f652d65, 0x3e611f5b, 0x3ef485be, 0x3f5cc9a4, 0x3eb3dc17, 0x3ee47600, 0x3f08f71e, 0x3ec4c026, 0x3ebd9392, 0x3f23870b, 0x3e381d21, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f7b7949, 0xbe96af17, 0x3d862f3d, 0xbe02c256, 0x3e79d036, 0x3e8ae6fb, 0xbe1a63b8, 0x3edec475, 0x3e33d22f, 0x3ea3e8e9, 0x3e0f3ff3, 0xbe48f6f3, 0xbdba3693, 0x3d3d3329, 0x3e817f81, 0xbd4dae2a, 0x3ebde302, 0x3eb4c6d9, 0x3e0ba1c4, 0xbe5d5716, 0x3dff5eed, 0xbe19bec5, 0xbdc0d10c, 0x3ef499a3, 0x3ddd73bf, 0x3e1ff243, 0x3ebed99a, 0x3e984c2d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f88eb09, 0x3f0adf56, 0x3eb39489, 0x3f30cb63, 0x3e900027, 0x3f06f4dc, 0x3eff6508, 0x3e87c29b, 0x3dc86225, 0xbe52f12b, 0x3ee39afb, 0x3f4c3fb8, 0x3e1aaea2, 0x3f14b38d, 0x3ee5fbcd, 0x3e31951e, 0x3e724266, 0x3e955d81, 0x3e180fac, 0x3eab9fb5, 0x3e79b1db, 0x3e96a2c6, 0x3a527070, 0x3ed6ace1, 0xbcf6c8cf, 0x3d846b61, 0x3e1a687b, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f902fa4, 0xbc5949a5, 0x3da3cc80, 0x3f285b86, 0x3d7bafb9, 0x3ec5d6c0, 0x3e8b3504, 0xbd6e5718, 0x3df4eb3c, 0x3e395c5d, 0x3ec313ea, 0x3ebfd1dd, 0x3db14b55, 0xbd862458, 0x3ededa65, 0x3e8b620f, 0x3ed4cdff, 0xbcd7b6b0, 0xbbbd9084, 0x3e7253b3, 0x3e85fa4c, 0x3e65e902, 0x3e891ccf, 0x3f1ad9f3, 0x3c749396, 0x3e4df753, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f9bf79e, 0x3ea9d397, 0xbd229d4e, 0x3e3f0b10, 0x3e039ca3, 0x3e5d753f, 0x3e222d27, 0x3f234fef, 0x3f2016dd, 0xbcfcd2b4, 0x3e958a6a, 0x3ed9d4f1, 0x3b676e50, 0x3ece5899, 0x3f3ff845, 0x3f1f050d, 0x3f2d29f1, 0xbe480458, 0x3e19363c, 0x3ebfef55, 0xbefc1e08, 0xbd64a411, 0xbe2657bc, 0x3eb2262b, 0x3e43234f, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f88a7e5, 0xbda51752, 0xbe277b60, 0x3c9c3631, 0x3e0bdad2, 0xbe225cd9, 0x3e646ba0, 0xbe38374a, 0xbe0fd4e7, 0xbda9cb5c, 0x3d97b7f4, 0x3e45e165, 0xbdccf1dc, 0x3e2ff083, 0x3e2aeb6e, 0x3eadea70, 0x3dbba655, 0x3ebcfdd1, 0xbd8164c2, 0xbd442ce7, 0x3df7409b, 0xbe3a87c6, 0x3dcb9cb3, 0xbea4fff1, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4e638a, 0xbd9ca24f, 0x3e6bdfdd, 0x3ef63be5, 0xbd8c9c09, 0x3e70b47a, 0x3e5fe311, 0x3ec43af9, 0xbd1829d1, 0xbd9edc16, 0x3e8652f3, 0x3ed33a59, 0x3e7cad18, 0x3e27ed00, 0xbd14f101, 0x3edc293e, 0x3e2ac125, 0x3ded03f1, 0xbd20311e, 0x3edd7536, 0x3e309f61, 0x3ed9c0af, 0x3eeabe27, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f3f15bd, 0xbc90797f, 0x3e95dc6c, 0xbe7b3653, 0x3e48c2eb, 0xbcd4bcd8, 0xbe91c521, 0xbcdfa6db, 0xbed9ce36, 0x3d8bef0e, 0x3e44a3d6, 0xbde73239, 0x3d4fd288, 0x3d5d78f0, 0xbe22b48d, 0xbd04faaa, 0xbd82b722, 0x3da108f3, 0x3dd22501, 0x3dd5a70b, 0xbe8636b0, 0x3d6752b6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f0d5b49, 0x3e1f4ae9, 0xbe092aeb, 0x3dcc57f8, 0xbd9a28b1, 0x3dc4f1af, 0x3e1f374b, 0xbe48b4c0, 0x3eb7a481, 0x3e19131a, 0xbcad5015, 0xbd1e3a21, 0x3d0b9f21, 0x3c9931ac, 0xbed000fb, 0x3eed3565, 0x3e1869dd, 0x3dbc15ff, 0x3edb5fed, 0xbdea3fb3, 0xbeefa999, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4bcf73, 0xbe3ca598, 0xbe3fe3f9, 0xbe4f5356, 0xbe72d40b, 0xbe85f74d, 0xbded8160, 0xbe384fa9, 0x3dff82e7, 0xbdb55ea1, 0xbd5cfb0c, 0x3e5bf0e0, 0x3d38596d, 0xbeaa901a, 0x3e07d765, 0xbe82ab3c, 0xbd01db98, 0x3e4186bc, 0x3e8b0f85, 0xbdf415c8, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f41f9a6, 0xbdd93e4c, 0xbee61cb1, 0x3e791b64, 0x3e6d8843, 0xbe7f4207, 0xbea486b8, 0x3ebcb10f, 0x3e3238ae, 0xbc3e4c82, 0xbd72f223, 0xba747cca, 0xbe21e2fe, 0xbd2f1a15, 0x3eefc711, 0x3f0922c8, 0x3d92a76f, 0x3d9075a7, 0x3e9215c4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6a1999, 0x3eaea4b7, 0xbefba323, 0x3aca93bc, 0xbdf07be7, 0x3ea11a93, 0x3e01a990, 0x3ec0a613, 0x3db732a2, 0x3ef438d5, 0x3de1efca, 0x3ad7ec32, 0x3eaf3aac, 0xbe2bfdd2, 0x3e571628, 0xbdcd0c38, 0x3bfc4054, 0x3e2d84d5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4f6ef0, 0x3dc3ec22, 0xbe3b0616, 0x3e585371, 0xbe15d384, 0x3e81a1c1, 0x3edb34f1, 0x3f0b6fcf, 0x3eceea10, 0xbc05230d, 0xbd80f696, 0xbed7240a, 0xba882a00, 0xbd857de1, 0x3d65aed6, 0x3e8805ae, 0xbca81fe2, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1d6961, 0x3ecb9c4a, 0x3df08d17, 0xbd7ed1e9, 0x3cf03d87, 0xbcd7cbdd, 0xbe4d4e3b, 0x3dfdd034, 0x3e7d422d, 0x3e1c00ca, 0x3e68d67b, 0x3d61be1e, 0x3e1ed3bd, 0xbe471fdf, 0x3d3492de, 0x3e4dda43, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f484c42, 0xbe9c4f81, 0xbd4b3ced, 0x3de547c3, 0x3b622300, 0xbdc19890, 0x3c9bb2e5, 0x3e99b04f, 0xbc2c091a, 0x3db111bd, 0xbe127a55, 0x3e2894ab, 0x3e16a605, 0x3dd051f2, 0x3c704ffd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eefe6f3, 0xbe1facf3, 0xbd09181f, 0xbdcc1aab, 0xbe63f631, 0xbe88bc13, 0xbeb90482, 0xbe4b234c, 0xbd11d08e, 0xbe0bf1ef, 0xbcdcb893, 0xbda1eb83, 0x3ea45d17, 0x3e31eafa, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4acb23, 0xbe5d41d6, 0xbe19bdbc, 0xbe497257, 0xbec776ed, 0xbdaf29d9, 0xbe6b89b7, 0x3f0686c1, 0xbe02c802, 0xbe35f149, 0xbd770f7d, 0x3e7d6ded, 0xbe8e807a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1c0919, 0x3d28f39b, 0xbd586394, 0x3e233ad2, 0x3e58e32d, 0x3ebdcf11, 0x3e82cfd6, 0xbd0d7c39, 0x3ee86239, 0x3c2be228, 0x3eb93715, 0x3e8cfc51, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f04a917, 0xbb6d7e7a, 0x3e25fb61, 0x3dd96f06, 0xbec25ae3, 0x3ed57861, 0xbdf1f6e3, 0xbe4170ec, 0x3e4dfb35, 0xbe35382e, 0x3d1021c0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eba3192, 0x3de69b4d, 0xbd322a63, 0x3e11bd17, 0x3e7ccf21, 0x3e0412e0, 0x3e2f08e9, 0xbe78407e, 0xbdbcfbec, 0x3d84c43c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f0e4c24, 0x3e50c287, 0xbce7e7d0, 0x3d513994, 0xbe2d032b, 0x3dd07560, 0xbe8c71e3, 0xbe46ccf8, 0xbe93af2d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ebaa0a0, 0xbe0dba43, 0xbe4e7264, 0xbe016185, 0xbe3575b9, 0x3e54513e, 0xbe2ad784, 0x3e945ba9, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f44b760, 0x3e99752d, 0x3daf3008, 0x3e33724e, 0x3e92d64f, 0x3ce953e2, 0x3d656f40, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ea466fe, 0xbd563b6a, 0xbe2282d6, 0xbcce5247, 0xbd6aed44, 0xbe7b9218, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ec64feb, 0x3e35eb31, 0x3d8d404d, 0xbd8de512, 0x3eaef8b3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e8b5f6b, 0xbe5c0897, 0xbe4462b2, 0xbc5c67b7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ea5f01a, 0xbdd75b3c, 0xbda7da4e, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ecb7776, 0xbe8d1593, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3e0aa5f4, 0x3f5db3d7, 0x3e93cd3a, 0x0, 0x3f5105ec }; static const uint32_t in_lotriangular_dpo[3111] = { 0x3f000000, 0x3f5db3d7, 0x0, 0x3e93cd3a, 0x3f5105ec, 0x3f3b70da, 0x0, 0x0, 0xbe838485, 0x3f3d6e02, 0x0, 0x3e9927dd, 0x3d7e0c28, 0x3f5ebdd4, 0x3f65057d, 0x0, 0x0, 0x0, 0x3f3a3698, 0x3e4832d6, 0x0, 0x0, 0x3f0c57ec, 0x3d9abf41, 0x3eaf479d, 0x0, 0x3f364419, 0xbda04cbf, 0xbecc3ece, 0x3e5f2388, 0x3f9c4f91, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f9f683c, 0x3f67bf66, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fad0ddb, 0x3f043a7f, 0x3ed2b428, 0x0, 0x0, 0x0, 0x0, 0x3f21af45, 0x3eccaabe, 0xbe7861a5, 0x3ef0ae64, 0x0, 0x0, 0x0, 0x3f719064, 0x3dc2e3bd, 0x3ee2a741, 0x3c980235, 0x3efff599, 0x0, 0x0, 0x3f547367, 0x3f3a6088, 0x3d054f79, 0x3d0f1f51, 0xbebde5f7, 0x3e1e6d26, 0x0, 0x3ef5d432, 0x3f16fd2f, 0xbe0b0773, 0x3e159041, 0xbe0aa01d, 0xbe16a250, 0x3dcb7cf1, 0x3f9d0810, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f811ca1, 0x3f2946e3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3faf7159, 0x3f40c62e, 0x3e9f91bc, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1ca24a, 0x3f009951, 0xbd28bf53, 0x3e9901b2, 0x0, 0x0, 0x0, 0x0, 0x3f608719, 0x3e937279, 0x3d929a62, 0x3da2f76c, 0x3f187ab6, 0x0, 0x0, 0x0, 0x3f123c02, 0x3f214e3f, 0xbea85eb5, 0xbe176f02, 0x3edabd60, 0x3e24ecc8, 0x0, 0x0, 0x3f635234, 0x3f05c177, 0x3e7fc645, 0x3d5ecfe1, 0xbdab63bb, 0xbcfb9056, 0x3ecf5956, 0x0, 0x3f5e424e, 0xbe2da5cc, 0xbdb2993f, 0x3e427c12, 0x3d1d7395, 0x3e4e9865, 0x3b897b82, 0x3ebc9108, 0x3f7d707b, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fab75f4, 0x3f428de4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6de464, 0x3ee41605, 0x3eead8e7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa7c175, 0x3f05ba69, 0x3e016506, 0x3f2a057b, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f859b0b, 0x3e80e72c, 0x3cb02b8d, 0x3e253296, 0x3ec7bc5f, 0x0, 0x0, 0x0, 0x0, 0x3f949b15, 0x3ee760df, 0x3b878e92, 0xbb6180aa, 0xbed32166, 0x3ea31834, 0x0, 0x0, 0x0, 0x3f799ffb, 0x3ec769c2, 0xbe3555b4, 0x3cd51530, 0xbea98cc9, 0xbebf9aa9, 0x3eff897b, 0x0, 0x0, 0x3fa3eccb, 0x3efe3329, 0xbeac6ec5, 0xbe88c951, 0xbdf8b671, 0x3d15ea8e, 0x3d3a081a, 0x3e53607c, 0x0, 0x3fa02ee8, 0x3f09d80b, 0xbcf12f29, 0x3e3ce591, 0xbd96bfa5, 0xbe8a9a04, 0xbe3f6faf, 0x3eb02902, 0x3e8335c8, 0x3fdd4638, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6b7920, 0x3f8475de, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fac4103, 0x3e8953db, 0x3f76742a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f638af1, 0x3e173cb7, 0x3f26fb3e, 0x3f3ffd4d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3faa0807, 0x3ed37a97, 0x3dd1cbf5, 0x3ddb6a65, 0x3f628013, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f5a921a, 0x3f0ac744, 0x3ec52941, 0xbe35a7c2, 0xbe08ff74, 0x3f2f479d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3faab41f, 0x3f08298a, 0x3e0cc863, 0xbca0d200, 0xbdb16315, 0xbea358b5, 0x3f2377d1, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb28187, 0x3f625399, 0x3eb6f0e2, 0x3e52440f, 0x3eeda6c8, 0x3e94796e, 0x3e26ef3a, 0x3f084cf8, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fe9916f, 0x3f5345fd, 0xbe1ae49d, 0x3e395ab4, 0xbc87a6cb, 0x3d723d17, 0x3ccf5733, 0xbd639284, 0x3f02e0d6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f82aaf8, 0x3ec08a03, 0x3ef42ab2, 0x3e2dfa36, 0xbd80e2c1, 0xbda9153b, 0x3d52024a, 0x3e81f5b5, 0xbdc42fd2, 0x3f1d4bad, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4f3829, 0x3ec42626, 0xbca9e043, 0x3eab1feb, 0x3ce52d21, 0xbd842df9, 0x3eac2bd0, 0x3eaefe3c, 0x3c72177f, 0x3ec2be32, 0x3e61b057, 0x0, 0x0, 0x0, 0x0, 0x3f8e4d5e, 0x3d4df680, 0x3f104ac4, 0x3e8845fc, 0x3ec27e58, 0x3d149770, 0x3ea33686, 0x3e8801bd, 0x3de24c62, 0x3d8cae81, 0xbd1f760c, 0x3f0009ae, 0x0, 0x0, 0x0, 0x3facee7c, 0x3f0e3808, 0x3dc6ee07, 0x3ee5fd75, 0xbe48c053, 0x3d8d1983, 0x3e8419f2, 0xbda8bfdf, 0xbe4056a2, 0x3e5e65c8, 0x3c505840, 0xbca63684, 0x3ec4ba9e, 0x0, 0x0, 0x3fbe0f69, 0x3dac65d3, 0xbe7580b5, 0xbe1db6e4, 0x3e78de12, 0x3edd6774, 0xbda97022, 0x3e4133d6, 0x3e8f80ed, 0x3eb41183, 0x3d2cf06c, 0xbc0dcf9f, 0xbd4a2fbb, 0x3e59466b, 0x0, 0x3f7320ec, 0xbd42aa76, 0x3efe9556, 0x3ef5b967, 0xbe687385, 0xbd784367, 0x3d292448, 0xbbe43c46, 0x3ecc3c5c, 0x3de49328, 0x3e0e3af1, 0xbd7a262f, 0x3bcebee0, 0xbd85da9a, 0x3d2f7d9e, 0x3e800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eb504f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eddb3d7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f000000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f0f1bbd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1cc471, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f2953fd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f3504f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f400000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4a62c2, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f544395, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f5db3d7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f66c15a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6f7751, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f77def6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x3fc66151, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f9c6eca, 0x3f912485, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f72f3d9, 0x3eba368c, 0x3f66aee6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f99c39f, 0x3f2c588b, 0x3ecaae9c, 0x3f8efd6a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa45b71, 0x3ea897d9, 0x3e93ef0b, 0x3ed38e5e, 0x3f2474e2, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fc08290, 0x3f1dfa41, 0x3e817b21, 0x3e4f02d0, 0xbdffd971, 0x3f2b8633, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb171d3, 0x3ed63c4c, 0x3edcb5b1, 0x3ebbdbf5, 0x3eb37eb4, 0x3d258cb4, 0x3f47e3e5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa7eb8e, 0x3f6d7fef, 0x3edc4a4e, 0x3ed12f98, 0x3dc009cd, 0xbeb7daa4, 0xbeb17800, 0x3f2989d6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f91e5da, 0x3f734e7a, 0x3e87c33a, 0x3f5a2622, 0x3e839b58, 0xbe5464df, 0x3d72f515, 0x3e961ec8, 0x3efb9bde, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f28b40e, 0x3f233daf, 0x3ea1e21c, 0x3efada62, 0x3cee0e88, 0x3db934d0, 0x3e1669d1, 0x3c2e3d62, 0xbec07903, 0x3f1c8887, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f89844b, 0x3f2f3cf2, 0x3f0d07d5, 0x3de866fe, 0xbe6b8030, 0xbeaa6179, 0x3f1d422a, 0x3eded9bc, 0xbe6afe9a, 0x3ca651c4, 0x3f1869a5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f9f6f60, 0x3f1f6e0c, 0x3ed5e753, 0x3e00b58a, 0xbd3bc139, 0x3dbcf436, 0x3ed02365, 0x3d170cb8, 0xbe9f9663, 0x3e0137b8, 0x3e0fc8cc, 0x3f533f36, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f629747, 0x3ec88672, 0x3ed7c0f2, 0xbe3284db, 0x3e8076a1, 0xbd158236, 0xbc7d7fc8, 0x3e02ad65, 0xbe88fdc9, 0x3da428c2, 0x3e158939, 0xbe18c19e, 0x3edcb926, 0x0, 0x0, 0x0, 0x0, 0x3f9fde05, 0x3f54fc87, 0x3ec872ab, 0x3ecd5456, 0x3e621ad5, 0xbe41ffab, 0x3e9be209, 0x3f2b3489, 0xbd90bbec, 0x3e25833f, 0x3e3718ff, 0xbe543e51, 0x3dd89711, 0x3eedad90, 0x0, 0x0, 0x0, 0x3f91da76, 0x3f5214db, 0x3e832618, 0x3e13423e, 0x3f31a590, 0xbdf00907, 0xbdb2a17c, 0x3f0d5ad3, 0xbe3b4f02, 0xbdd6c2d0, 0x3ec28036, 0x3a90e344, 0xbc213402, 0xbe6b1116, 0x3e7b822d, 0x0, 0x0, 0x3f205c2d, 0x3f7b6b31, 0x3e28d4db, 0x3ecc9368, 0x3e52fa09, 0xbdceb25b, 0xbe7c437c, 0x3db2c001, 0xbebd85e3, 0x3e9abcf9, 0x3b6f40fa, 0xbcc5f309, 0xbdb08688, 0x3e634aa3, 0xbcd33ac4, 0x3f0406f9, 0x0, 0x3fc0f458, 0x3f305ef3, 0x3ec418da, 0x3eec5aae, 0x3e331120, 0x3e2114b9, 0xbca5377f, 0x3eb69da8, 0x3e008ecd, 0xbe4db979, 0xbc674010, 0x3ee69cda, 0x3dbfb34f, 0x3ce60b73, 0xbbb5564e, 0xbd0b6e81, 0x3e17f757, 0x3ffed00c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd17cd5, 0x3fc40447, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40023062, 0x3f69519c, 0x3fc2c6c7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fde73b7, 0x3f72ace5, 0x3f092a3b, 0x3f9f52f7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa7bce4, 0x3f1477bc, 0x3ee96652, 0x3e2b093e, 0x3fa98274, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fde53f2, 0x3f8079b1, 0x3f5bab55, 0x3d7e5039, 0x3f261e96, 0x3f95520c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fcf000c, 0x3f9d8d20, 0x3f4cea61, 0x3e80bfcc, 0x3eebda8c, 0x3ec99979, 0x3f81c368, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f984f0b, 0x3db1fea7, 0x3ee4f662, 0x3e8a414d, 0x3f459096, 0x3f0af824, 0x3e08e904, 0x3f7fa105, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa7bebb, 0x3fa7575a, 0x3e46c933, 0x3e44755c, 0x3ea4b71e, 0x3e8b797f, 0x3dabd6c8, 0xbe2152aa, 0x3f8132e0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fbcc768, 0x3e9024a3, 0x3f03269b, 0x3f42a080, 0x3f1229ab, 0x3f879838, 0x3e4c8c48, 0xbda18021, 0xbcced5a8, 0x3f75356d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdcd9e8, 0x3f768946, 0x3f11e8f3, 0x3d834623, 0xbe320c0d, 0x3e8640da, 0x3e8b5d0c, 0x3e3de4b6, 0x3ebd51ad, 0x3e81ca64, 0x3f6ba7a5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd754f7, 0x3f082a0b, 0x3f88b972, 0x3ec00e29, 0x3e6211e4, 0x3f08d6fe, 0xbe63a8fa, 0x3e8986fb, 0xbe81476a, 0x3e961ac9, 0x3e60a3dc, 0x3f5fa451, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd01a6e, 0x3f4cf231, 0x3ecfb323, 0x3ba33586, 0x3ea69247, 0x3deba617, 0x3e827ad2, 0x3ec3efab, 0x3e8ca65f, 0xbe116fd0, 0x3d87f8df, 0x3f26b9f6, 0x3f348717, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fda05ff, 0x3f6771a0, 0x3eb9ea2c, 0x3e3917a6, 0x3e9691f7, 0x3ed31268, 0x3ebd6d87, 0x3f194be0, 0xbe1a8142, 0xbe4e4b11, 0x3da83152, 0x3f0a14ac, 0x3eeb2c85, 0x3f86ccf4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa733f3, 0x3f1d1042, 0x3f30e33b, 0xbdd776b5, 0x3ef5ad97, 0x3ea845a8, 0x3f24bba0, 0x3ef244f1, 0xbe425934, 0x3e9974ac, 0x3c6614d8, 0x3e167906, 0x3e3fbcac, 0x3eca7c36, 0x3f49449b, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdf9f18, 0x3f1d4800, 0x3f1fece6, 0x3f0d6a51, 0xbd765a7f, 0x3e8eeb70, 0x3ec3d74b, 0x3ecbcc7e, 0x3d9dffcf, 0xbe2168df, 0xbe08190e, 0x3d0a229c, 0x3d1ef589, 0x3db40187, 0x3eacdd97, 0x3f30b94a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ffd99ba, 0x3f7e6fb2, 0x3f0f3b87, 0x3d7fee6f, 0x3de7a1aa, 0x3b7ea369, 0x3d2bc6fb, 0x3d64b17d, 0x3da3e0b3, 0xbd9c4fda, 0x3e154967, 0xbd9e5677, 0x3e285852, 0x3e2294d2, 0xbe93799f, 0x3edad112, 0x3f528f2e, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3facfbe7, 0x3f47586e, 0x3ecae13e, 0x3ddf2103, 0xbd68a5ce, 0x3eb620dd, 0x3e8820e0, 0x3ec13cc3, 0x3d59d9dc, 0xbe5a1c37, 0x3e01225a, 0x3e7aaf69, 0x3eeff838, 0x3ee18727, 0x3d3497b2, 0xbc7cd569, 0xbe4623ca, 0x3f406dcf, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3faddd7c, 0x3f9cd3ce, 0x3ee5875d, 0x3e248c15, 0x3f453193, 0x3e2d7a27, 0x3ef2a046, 0x3e051b2c, 0x3e2bbb51, 0xbe622169, 0x3db2613f, 0x3e4d1c1e, 0xbcdc504a, 0x3d812a54, 0xbebba39a, 0xbd5d1b5a, 0xbdbea01d, 0x3ef0bd3a, 0x3f3d13e7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x4003bb43, 0x3ed0e300, 0x3f031c42, 0x3f109e7a, 0x3e774141, 0x3f014d84, 0x3edf8cd0, 0x3e76687f, 0xbdc5573d, 0x3e1f0d4d, 0xbe3c054b, 0x3ecc81b3, 0xbef8a0ef, 0x3e71921b, 0x3e815f3a, 0x3c9f6064, 0xbdf8f2df, 0x3e1a92ea, 0x3d73e74e, 0x3ef0d293, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3facec69, 0x3f2b8a20, 0x3f562f52, 0x3de743af, 0x3ea1aaaa, 0x3f1b2da5, 0x3eab4d6c, 0xbe87e2a6, 0x3d84c64a, 0xbd42cfa3, 0xbea134f9, 0xbc3d9575, 0xbed62816, 0xbcfd85d5, 0xbe62851f, 0x3e1bc900, 0xbe58912c, 0xbd97977a, 0x3d4acd2f, 0xbc3264fb, 0x3f25a676, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fcc3179, 0x3f022e4a, 0x3e648cdf, 0x3f269697, 0x3eb8ccfa, 0x3c645a85, 0x3f0e0695, 0x3e6882e1, 0x3c61b8de, 0xbd4d43b7, 0xbe53ba18, 0x3b919a5b, 0x3e25a656, 0x3e2379f6, 0x3e02d45e, 0x3df6f0b7, 0x3f091655, 0x3ecbeb20, 0xbd769583, 0xbd951e4c, 0xbdf04e1a, 0x3f2520c9, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb301be, 0x3e8d19e9, 0x3f24aa50, 0x3e31f7f3, 0x3e80be5c, 0x3e7bfe2b, 0x3dfe6726, 0x3e8cdb69, 0x3e32022b, 0x3de75f11, 0x3c3c3ef7, 0x3e8cb874, 0x3e05faf3, 0x3c9f1372, 0x3dd6ba26, 0x3e6d1ea0, 0xbd6f836c, 0xbe91b4c0, 0xbdab98c2, 0x3e98c134, 0xbc7c5055, 0xbd3c82d4, 0x3f1a4db4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd30b04, 0x3f2a9af8, 0x3d7e078d, 0x3f2dcf40, 0x3ebfb78b, 0x3eee2e8f, 0x3f149fe6, 0x3e40f4ba, 0x3df94fd7, 0x3e4f5336, 0xbe3b6992, 0xbe799d4e, 0xbe66afb9, 0x3e47d99a, 0xbe084e2f, 0xbda8dfc8, 0xbd7209c7, 0x3daf3e3b, 0xbe253f51, 0xbeaf18b4, 0xbc75fd76, 0x3e89d61f, 0xbdb40f1f, 0x3ec91cea, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fe6958f, 0x3f9d887e, 0x3f942bc5, 0x3da7cd2b, 0x3ef28d20, 0x3e84ac2f, 0x3ecb6b9c, 0x3eb5499f, 0x3e56340c, 0xbe185b4f, 0xbe43fd6d, 0x3e730c6d, 0x3de55016, 0x3d8e4a1c, 0xbd1d7e16, 0x3de81a83, 0x3bd81574, 0x3e7f68af, 0x3e61c6a6, 0xbe102d47, 0x3dec6dab, 0xbe24133f, 0xbdb0bf8c, 0x3e9e1d23, 0x3f11aa31, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd1922c, 0x3f640eb1, 0x3f1a6aae, 0x3e81a394, 0x3f2044ac, 0x3e29c5e5, 0x3e8263ba, 0x3dec7d26, 0x3e99e3ce, 0xbeb42111, 0x3cd06a71, 0xbdb3cea7, 0x3edde5a6, 0xbce1e008, 0xbed6bc1f, 0xbe254da8, 0x3e4b5427, 0x3f1e4fb9, 0x3bbebad8, 0xbe8e6d28, 0xbe8c801d, 0x3e814259, 0xbe3bc874, 0x3eb6982a, 0x3e8d05d8, 0x3e93855c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb7a845, 0x3f5770f0, 0x3e9f1b20, 0x3dd47221, 0x3ec97360, 0x3e48c3dc, 0x3de3873d, 0x3ebde9e2, 0x3ef12513, 0x3cb30022, 0xbcbd66d0, 0x3e5d9024, 0x3e834f6f, 0x3e76df67, 0x3ed08fe6, 0x3d2fb9d2, 0xbdc658d8, 0x3eb784e4, 0x3cb98c8a, 0xbcdd1392, 0x3d9fe26a, 0x3e0c5697, 0xbe4b5028, 0xbacaebd0, 0xbe3b3d87, 0xbe2f5a6d, 0x3edaad0c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb8e880, 0x3eebce56, 0x3f0a2ab2, 0x3ee7860b, 0x3f07c3bb, 0x3ec56276, 0x3ea99425, 0x3e6f1147, 0x3d8130d6, 0x3e4356fe, 0xbdc396b4, 0xbdf45454, 0xbe44d9cd, 0x3df2a441, 0xbdbb511f, 0xbdab5415, 0xbec698e0, 0x3d40ff7f, 0xbe84fabb, 0xbeaaed36, 0x3eb3ec66, 0x3ddde002, 0x3d9b27a0, 0x3dafd7c1, 0x3e00b1aa, 0x3d57c6a6, 0xbe899da0, 0x3e7f182c, 0x0, 0x0, 0x0, 0x0, 0x3fe5880a, 0x3f1fdf8c, 0x3f4561d8, 0x3e99ea6f, 0xbdcbf0d6, 0x3efdde26, 0x3caa7198, 0x3eaa86b6, 0x3d1fd57d, 0x3e74a256, 0x3e1996c6, 0x3e138086, 0x3ebcc931, 0x3e57df72, 0x3e08b418, 0x3eafd807, 0xbc8d5878, 0xbf08bca4, 0xbe983185, 0x3e419b56, 0x3dd42e35, 0x3e3693a4, 0x3dfc6018, 0x3dd5c1a9, 0x3e335f87, 0x3e5deb5d, 0xbea6af52, 0xbd0bef14, 0x3e96f9e4, 0x0, 0x0, 0x0, 0x3fc583ec, 0x3f76f355, 0x3f379767, 0x3dfc5afc, 0x3f682cab, 0x3e9231b1, 0x3ebf488b, 0x3e931e90, 0xbd35737b, 0xba78aea8, 0x3da06f84, 0x3e6a2d9e, 0x3e6a6512, 0xbdf785b0, 0x3efbcc72, 0x3e2c97eb, 0xbdd1977c, 0xbdc246f1, 0x3d78ffbd, 0x3e906d7e, 0x3c977699, 0xbe289647, 0xbc02664f, 0xbc8de41c, 0x3e55cf5a, 0xbd66e2c9, 0x3e223add, 0xbd1ea502, 0xbdb44bea, 0x3eb41992, 0x0, 0x0, 0x3fb82540, 0x3f5eb20d, 0x3efebc0c, 0x3e4abbd9, 0x3f0aa8bc, 0x3ea50875, 0x3e48e6fa, 0x3e26f2b5, 0x3ec47b5f, 0xbe00434d, 0xbeadf6ab, 0xbe66ea82, 0xbe76ea35, 0x3da69860, 0x3dd307ad, 0x3ee8a413, 0x3e3637e3, 0xbde60450, 0xbe4b1942, 0x3c1b32db, 0x3eb7f8e0, 0xbbe2881d, 0x3c7ac888, 0x3e074632, 0xbcceb64b, 0x3c97665c, 0xbdceb1de, 0xbd0d1509, 0xbd991fa7, 0xbdd33771, 0x3db1562b, 0x0, 0x3fe0be31, 0x3f81548a, 0x3f29b060, 0x3e68e017, 0x3f3dfdbb, 0x3e94b3f3, 0x3de39e37, 0xbe190357, 0x3e904fbf, 0x3ed4ef3d, 0xbe848e31, 0x3d8e1940, 0xbdf93878, 0x3f0e997c, 0x3e47e307, 0xbcff24c7, 0xbe1d0e4a, 0xbe505ec4, 0x3c516c4a, 0xbebfb6cd, 0x3b9f50f9, 0x3e32a77d, 0x3cf347c8, 0x3cc28577, 0x3e906a10, 0xbe1435d3, 0xbe38a553, 0xbe5ed6db, 0xbe036a23, 0xbe3162b7, 0xbe50b8c7, 0x3d31b0af, 0x401ab7a6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40061126, 0x3fe80c14, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd941f9, 0x3ed5e08b, 0x3f9d2a7d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd74bb3, 0x3f304d4f, 0x3f163839, 0x3f896eea, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fc3c04c, 0x3ece94f6, 0x3edcbc07, 0x3df75abf, 0x3fa40b4f, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x4001717c, 0x3f19b4bb, 0x3f32ff99, 0x3dd7e5a8, 0x3f392e5d, 0x3f7b7949, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd246e3, 0x3f184b09, 0x3ea3d6dd, 0xbd8e9a16, 0x3f0b18fc, 0xbe96af17, 0x3f88eb09, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fee673b, 0x3f1abdde, 0x3f163587, 0x3f1e383c, 0x3ef23e21, 0x3d862f3d, 0x3f0adf56, 0x3f902fa4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fc65885, 0x3f0f73d4, 0x3ec5dc61, 0x3ebcc7e9, 0x3f0c84ae, 0xbe02c256, 0x3eb39489, 0xbc5949a5, 0x3f9bf79e, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40068cdf, 0x3f5f0d68, 0x3eac7b1b, 0x3ef68c95, 0x3ed978dc, 0x3e79d036, 0x3f30cb63, 0x3da3cc80, 0x3ea9d397, 0x3f88a7e5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd3a07e, 0x3e8767eb, 0x3f170e1d, 0x3e7b7bc5, 0x3f80168d, 0x3e8ae6fb, 0x3e900027, 0x3f285b86, 0xbd229d4e, 0xbda51752, 0x3f4e638a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fda2416, 0x3f040035, 0xbd818679, 0x3d56da0b, 0x3ecba874, 0xbe1a63b8, 0x3f06f4dc, 0x3d7bafb9, 0x3e3f0b10, 0xbe277b60, 0xbd9ca24f, 0x3f3f15bd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x4014add8, 0x3f6a5edf, 0x3ea1e6f6, 0x3eedf8d1, 0x3e464816, 0x3edec475, 0x3eff6508, 0x3ec5d6c0, 0x3e039ca3, 0x3c9c3631, 0x3e6bdfdd, 0xbc90797f, 0x3f0d5b49, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb1120c, 0x3e482b8f, 0x3e783bb3, 0x3dffd899, 0x3f1efa0c, 0x3e33d22f, 0x3e87c29b, 0x3e8b3504, 0x3e5d753f, 0x3e0bdad2, 0x3ef63be5, 0x3e95dc6c, 0x3e1f4ae9, 0x3f4bcf73, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ffa8e56, 0x3f2f89a7, 0x3f1d5f90, 0x3ef7a25a, 0x3e8b26e3, 0x3ea3e8e9, 0x3dc86225, 0xbd6e5718, 0x3e222d27, 0xbe225cd9, 0xbd8c9c09, 0xbe7b3653, 0xbe092aeb, 0xbe3ca598, 0x3f41f9a6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ffa4e9a, 0x3f5bf783, 0x3ee533cf, 0x3f1cadac, 0x3e6ef295, 0x3e0f3ff3, 0xbe52f12b, 0x3df4eb3c, 0x3f234fef, 0x3e646ba0, 0x3e70b47a, 0x3e48c2eb, 0x3dcc57f8, 0xbe3fe3f9, 0xbdd93e4c, 0x3f6a1999, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdb5581, 0x3ead2780, 0x3e4c5c87, 0x3ebbde25, 0x3e60f959, 0xbe48f6f3, 0x3ee39afb, 0x3e395c5d, 0x3f2016dd, 0xbe38374a, 0x3e5fe311, 0xbcd4bcd8, 0xbd9a28b1, 0xbe4f5356, 0xbee61cb1, 0x3eaea4b7, 0x3f4f6ef0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fbabd7f, 0x3f3c2e80, 0x3f1d8f7c, 0x3e14e974, 0x3e088ea2, 0xbdba3693, 0x3f4c3fb8, 0x3ec313ea, 0xbcfcd2b4, 0xbe0fd4e7, 0x3ec43af9, 0xbe91c521, 0x3dc4f1af, 0xbe72d40b, 0x3e791b64, 0xbefba323, 0x3dc3ec22, 0x3f1d6961, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdf4c09, 0x3f262261, 0x3e200e2c, 0xbdd0e15c, 0x3f071e23, 0x3d3d3329, 0x3e1aaea2, 0x3ebfd1dd, 0x3e958a6a, 0xbda9cb5c, 0xbd1829d1, 0xbcdfa6db, 0x3e1f374b, 0xbe85f74d, 0x3e6d8843, 0x3aca93bc, 0xbe3b0616, 0x3ecb9c4a, 0x3f484c42, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x4004bb00, 0x3f701706, 0x3ef9cdfa, 0x3ee22fa3, 0x3dbda156, 0x3e817f81, 0x3f14b38d, 0x3db14b55, 0x3ed9d4f1, 0x3d97b7f4, 0xbd9edc16, 0xbed9ce36, 0xbe48b4c0, 0xbded8160, 0xbe7f4207, 0xbdf07be7, 0x3e585371, 0x3df08d17, 0xbe9c4f81, 0x3eefe6f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fcbbb9f, 0x3f4946fe, 0x3e869e93, 0x3e828a03, 0x3ee99eb5, 0xbd4dae2a, 0x3ee5fbcd, 0xbd862458, 0x3b676e50, 0x3e45e165, 0x3e8652f3, 0x3d8bef0e, 0x3eb7a481, 0xbe384fa9, 0xbea486b8, 0x3ea11a93, 0xbe15d384, 0xbd7ed1e9, 0xbd4b3ced, 0xbe1facf3, 0x3f4acb23, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f8363da, 0x3f81dacd, 0x3e9ef900, 0x3e340578, 0x3ec843e9, 0x3ebde302, 0x3e31951e, 0x3ededa65, 0x3ece5899, 0xbdccf1dc, 0x3ed33a59, 0x3e44a3d6, 0x3e19131a, 0x3dff82e7, 0x3ebcb10f, 0x3e01a990, 0x3e81a1c1, 0x3cf03d87, 0x3de547c3, 0xbd09181f, 0xbe5d41d6, 0x3f1c0919, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fbf3e2b, 0x3f298a07, 0x3e3bdc80, 0x3e45dc7b, 0x3f652d65, 0x3eb4c6d9, 0x3e724266, 0x3e8b620f, 0x3f3ff845, 0x3e2ff083, 0x3e7cad18, 0xbde73239, 0xbcad5015, 0xbdb55ea1, 0x3e3238ae, 0x3ec0a613, 0x3edb34f1, 0xbcd7cbdd, 0x3b622300, 0xbdcc1aab, 0xbe19bdbc, 0x3d28f39b, 0x3f04a917, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40038518, 0x3f091d10, 0x3df1e1a8, 0x3e4076ba, 0x3e611f5b, 0x3e0ba1c4, 0x3e955d81, 0x3ed4cdff, 0x3f1f050d, 0x3e2aeb6e, 0x3e27ed00, 0x3d4fd288, 0xbd1e3a21, 0xbd5cfb0c, 0xbc3e4c82, 0x3db732a2, 0x3f0b6fcf, 0xbe4d4e3b, 0xbdc19890, 0xbe63f631, 0xbe497257, 0xbd586394, 0xbb6d7e7a, 0x3eba3192, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ff4fd67, 0x3f4d98db, 0x3efc9456, 0x3ede99dc, 0x3ef485be, 0xbe5d5716, 0x3e180fac, 0xbcd7b6b0, 0x3f2d29f1, 0x3eadea70, 0xbd14f101, 0x3d5d78f0, 0x3d0b9f21, 0x3e5bf0e0, 0xbd72f223, 0x3ef438d5, 0x3eceea10, 0x3dfdd034, 0x3c9bb2e5, 0xbe88bc13, 0xbec776ed, 0x3e233ad2, 0x3e25fb61, 0x3de69b4d, 0x3f0e4c24, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdd6d17, 0x3f8355b0, 0x3ef6881a, 0x3e0a89a7, 0x3f5cc9a4, 0x3dff5eed, 0x3eab9fb5, 0xbbbd9084, 0xbe480458, 0x3dbba655, 0x3edc293e, 0xbe22b48d, 0x3c9931ac, 0x3d38596d, 0xba747cca, 0x3de1efca, 0xbc05230d, 0x3e7d422d, 0x3e99b04f, 0xbeb90482, 0xbdaf29d9, 0x3e58e32d, 0x3dd96f06, 0xbd322a63, 0x3e50c287, 0x3ebaa0a0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40038fb1, 0x3f12c6b5, 0xbd5c574f, 0xbe5a89cc, 0x3eb3dc17, 0xbe19bec5, 0x3e79b1db, 0x3e7253b3, 0x3e19363c, 0x3ebcfdd1, 0x3e2ac125, 0xbd04faaa, 0xbed000fb, 0xbeaa901a, 0xbe21e2fe, 0x3ad7ec32, 0xbd80f696, 0x3e1c00ca, 0xbc2c091a, 0xbe4b234c, 0xbe6b89b7, 0x3ebdcf11, 0xbec25ae3, 0x3e11bd17, 0xbce7e7d0, 0xbe0dba43, 0x3f44b760, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ffe22aa, 0x3f7cfe11, 0x3f337c3a, 0x3f27bd86, 0x3ee47600, 0xbdc0d10c, 0x3e96a2c6, 0x3e85fa4c, 0x3ebfef55, 0xbd8164c2, 0x3ded03f1, 0xbd82b722, 0x3eed3565, 0x3e07d765, 0xbd2f1a15, 0x3eaf3aac, 0xbed7240a, 0x3e68d67b, 0x3db111bd, 0xbd11d08e, 0x3f0686c1, 0x3e82cfd6, 0x3ed57861, 0x3e7ccf21, 0x3d513994, 0xbe4e7264, 0x3e99752d, 0x3ea466fe, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fca3b9f, 0x3f1eb216, 0x3ed12b35, 0x3e823f19, 0x3f08f71e, 0x3ef499a3, 0x3a527070, 0x3e65e902, 0xbefc1e08, 0xbd442ce7, 0xbd20311e, 0x3da108f3, 0x3e1869dd, 0xbe82ab3c, 0x3eefc711, 0xbe2bfdd2, 0xba882a00, 0x3d61be1e, 0xbe127a55, 0xbe0bf1ef, 0xbe02c802, 0xbd0d7c39, 0xbdf1f6e3, 0x3e0412e0, 0xbe2d032b, 0xbe016185, 0x3daf3008, 0xbd563b6a, 0x3ec64feb, 0x0, 0x0, 0x0, 0x0, 0x3fd33c8d, 0x3f5dd138, 0x3f0887eb, 0x3cbbbb64, 0x3ec4c026, 0x3ddd73bf, 0x3ed6ace1, 0x3e891ccf, 0xbd64a411, 0x3df7409b, 0x3edd7536, 0x3dd22501, 0x3dbc15ff, 0xbd01db98, 0x3f0922c8, 0x3e571628, 0xbd857de1, 0x3e1ed3bd, 0x3e2894ab, 0xbcdcb893, 0xbe35f149, 0x3ee86239, 0xbe4170ec, 0x3e2f08e9, 0x3dd07560, 0xbe3575b9, 0x3e33724e, 0xbe2282d6, 0x3e35eb31, 0x3e8b5f6b, 0x0, 0x0, 0x0, 0x40005364, 0x3ee57533, 0x3ed19026, 0x3efdd8a8, 0x3ebd9392, 0x3e1ff243, 0xbcf6c8cf, 0x3f1ad9f3, 0xbe2657bc, 0xbe3a87c6, 0x3e309f61, 0x3dd5a70b, 0x3edb5fed, 0x3e4186bc, 0x3d92a76f, 0xbdcd0c38, 0x3d65aed6, 0xbe471fdf, 0x3e16a605, 0xbda1eb83, 0xbd770f7d, 0x3c2be228, 0x3e4dfb35, 0xbe78407e, 0xbe8c71e3, 0x3e54513e, 0x3e92d64f, 0xbcce5247, 0x3d8d404d, 0xbe5c0897, 0x3ea5f01a, 0x0, 0x0, 0x3fe6ff66, 0x3eba9146, 0x3c83dfaf, 0x3edd2647, 0x3f23870b, 0x3ebed99a, 0x3d846b61, 0x3c749396, 0x3eb2262b, 0x3dcb9cb3, 0x3ed9c0af, 0xbe8636b0, 0xbdea3fb3, 0x3e8b0f85, 0x3d9075a7, 0x3bfc4054, 0x3e8805ae, 0x3d3492de, 0x3dd051f2, 0x3ea45d17, 0x3e7d6ded, 0x3eb93715, 0xbe35382e, 0xbdbcfbec, 0xbe46ccf8, 0xbe2ad784, 0x3ce953e2, 0xbd6aed44, 0xbd8de512, 0xbe4462b2, 0xbdd75b3c, 0x3ecb7776, 0x0, 0x3fdd4ae8, 0x3eb04174, 0x3f15201d, 0x3f08b381, 0x3e381d21, 0x3e984c2d, 0x3e1a687b, 0x3e4df753, 0x3e43234f, 0xbea4fff1, 0x3eeabe27, 0x3d6752b6, 0xbeefa999, 0xbdf415c8, 0x3e9215c4, 0x3e2d84d5, 0xbca81fe2, 0x3e4dda43, 0x3c704ffd, 0x3e31eafa, 0xbe8e807a, 0x3e8cfc51, 0x3d1021c0, 0x3d84c43c, 0xbe93af2d, 0x3e945ba9, 0x3d656f40, 0xbe7b9218, 0x3eaef8b3, 0xbc5c67b7, 0xbda7da4e, 0xbe8d1593, 0x3e0aa5f4, 0x3f5db3d7, 0x0, 0x3e93cd3a, 0x3f5105ec }; static const uint16_t in_dims[98] = { 0x0001, 0x0001, 0x0001, 0x0002, 0x0001, 0x0003, 0x0001, 0x0004, 0x0001, 0x0003, 0x0001, 0x0008, 0x0001, 0x000B, 0x0002, 0x0001, 0x0002, 0x0002, 0x0002, 0x0003, 0x0002, 0x0004, 0x0002, 0x0003, 0x0002, 0x0008, 0x0002, 0x000B, 0x0003, 0x0001, 0x0003, 0x0002, 0x0003, 0x0003, 0x0003, 0x0004, 0x0003, 0x0003, 0x0003, 0x0008, 0x0003, 0x000B, 0x0004, 0x0001, 0x0004, 0x0002, 0x0004, 0x0003, 0x0004, 0x0004, 0x0004, 0x0003, 0x0004, 0x0008, 0x0004, 0x000B, 0x0003, 0x0001, 0x0003, 0x0002, 0x0003, 0x0003, 0x0003, 0x0004, 0x0003, 0x0003, 0x0003, 0x0008, 0x0003, 0x000B, 0x0008, 0x0001, 0x0008, 0x0002, 0x0008, 0x0003, 0x0008, 0x0004, 0x0008, 0x0003, 0x0008, 0x0008, 0x0008, 0x000B, 0x000B, 0x0001, 0x000B, 0x0002, 0x000B, 0x0003, 0x000B, 0x0004, 0x000B, 0x0003, 0x000B, 0x0008, 0x000B, 0x000B }; static const uint16_t in_inv_dims[13] = { 0x0001, 0x0002, 0x0003, 0x0004, 0x0007, 0x0008, 0x0009, 0x000F, 0x0010, 0x0011, 0x0020, 0x0021, 0x0002 }; static const uint16_t in_cholesky_dpo_dims[13] = { 0x0001, 0x0002, 0x0003, 0x0004, 0x0007, 0x0008, 0x0009, 0x000F, 0x0010, 0x0011, 0x0020, 0x0021, 0x0002 }; static const uint32_t ref_add[1024] = { 0x3eb91935, 0x3eb91935, 0xbec5673f, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3eb91935, 0xbec5673f, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3d4e9954, 0xbf029330, 0xbeaba399, 0x3e603fe1, 0x3dc4b040, 0xbe006f81, 0xbd0261be, 0x3ce7c3cf, 0xbef53d21, 0x3df1d97f, 0xbd4af898, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3d4e9954, 0xbf029330, 0xbeaba399, 0x3e603fe1, 0x3dc4b040, 0xbe006f81, 0xbd0261be, 0x3ce7c3cf, 0xbef53d21, 0x3df1d97f, 0xbd4af898, 0xbea81a32, 0x3e8e2d0f, 0x3e720018, 0x3e9167f4, 0xbe7ec92e, 0xbe8942f6, 0x3e1f1922, 0xbe641150, 0x3ea94eb0, 0x3de0a65e, 0x3f152db6, 0x3ea90aac, 0xbd05532e, 0xbefb586b, 0xbe53bc19, 0x3e63431f, 0x3e26c5fa, 0x3d14de7a, 0xbebe16a1, 0xbeffcd3a, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3d4e9954, 0xbf029330, 0xbeaba399, 0x3e603fe1, 0x3dc4b040, 0xbe006f81, 0xbd0261be, 0x3ce7c3cf, 0xbef53d21, 0x3df1d97f, 0xbd4af898, 0xbea81a32, 0x3e8e2d0f, 0x3e720018, 0x3e9167f4, 0xbe7ec92e, 0xbe8942f6, 0x3e1f1922, 0xbe641150, 0x3ea94eb0, 0x3de0a65e, 0x3f152db6, 0x3ea90aac, 0xbd05532e, 0xbefb586b, 0xbe53bc19, 0x3e63431f, 0x3e26c5fa, 0x3d14de7a, 0xbebe16a1, 0xbeffcd3a, 0xbe49ab5d, 0x3f21fb2c, 0xba4d69f8, 0x3cde2ac8, 0x3e815827, 0xbdf1d350, 0x3f37b809, 0xbf080d12, 0x3ecfa67e, 0xbe71f6ce, 0x3e97c4ba, 0x3ead03e9, 0xbf16a176, 0x3fa338b6, 0x3efa4984, 0x3ee18806, 0xbf0b2434, 0xbc3f9834, 0xbefcc41f, 0xbed45640, 0x3f00cd1f, 0x3e52b555, 0x3f2ab4b6, 0x3d3d75eb, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3d4e9954, 0xbf029330, 0xbeaba399, 0x3e603fe1, 0x3dc4b040, 0xbe006f81, 0xbd0261be, 0x3ce7c3cf, 0xbef53d21, 0x3df1d97f, 0xbd4af898, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3d4e9954, 0xbf029330, 0xbeaba399, 0x3e603fe1, 0x3dc4b040, 0xbe006f81, 0xbd0261be, 0x3ce7c3cf, 0xbef53d21, 0x3df1d97f, 0xbd4af898, 0xbea81a32, 0x3e8e2d0f, 0x3e720018, 0x3e9167f4, 0xbe7ec92e, 0xbe8942f6, 0x3e1f1922, 0xbe641150, 0x3ea94eb0, 0x3de0a65e, 0x3f152db6, 0x3ea90aac, 0xbd05532e, 0xbefb586b, 0xbe53bc19, 0x3e63431f, 0x3e26c5fa, 0x3d14de7a, 0xbebe16a1, 0xbeffcd3a, 0xbe49ab5d, 0x3f21fb2c, 0xba4d69f8, 0x3cde2ac8, 0x3e815827, 0xbdf1d350, 0x3f37b809, 0xbf080d12, 0x3ecfa67e, 0xbe71f6ce, 0x3e97c4ba, 0x3ead03e9, 0xbf16a176, 0x3fa338b6, 0x3efa4984, 0x3ee18806, 0xbf0b2434, 0xbc3f9834, 0xbefcc41f, 0xbed45640, 0x3f00cd1f, 0x3e52b555, 0x3f2ab4b6, 0x3d3d75eb, 0x3eb91935, 0xbec5673f, 0xbe977e76, 0x3db58d3e, 0x3e9b275a, 0xbdfdb94e, 0xbef4c8bd, 0x3e45fac7, 0x3e83de13, 0xbecccaed, 0x3ea88f10, 0x3e9a3744, 0xbde22446, 0xbf92a45a, 0xbed0d2fc, 0xbe4f45a0, 0xbdd47d3e, 0xbf1d1a0c, 0xbdcb7230, 0x3f5256f6, 0x3ee7c422, 0xbec25cea, 0x3ddd2aa9, 0xbbf4745e, 0x3d803f4f, 0xbd3b9d18, 0x3efd2a9b, 0xbf01a013, 0x3eae3780, 0xbed8133d, 0x3df91285, 0xbf3d40f4, 0xbde9f927, 0x3d4e9954, 0xbf029330, 0xbeaba399, 0x3e603fe1, 0x3dc4b040, 0xbe006f81, 0xbd0261be, 0x3ce7c3cf, 0xbef53d21, 0x3df1d97f, 0xbd4af898, 0xbea81a32, 0x3e8e2d0f, 0x3e720018, 0x3e9167f4, 0xbe7ec92e, 0xbe8942f6, 0x3e1f1922, 0xbe641150, 0x3ea94eb0, 0x3de0a65e, 0x3f152db6, 0x3ea90aac, 0xbd05532e, 0xbefb586b, 0xbe53bc19, 0x3e63431f, 0x3e26c5fa, 0x3d14de7a, 0xbebe16a1, 0xbeffcd3a, 0xbe49ab5d, 0x3f21fb2c, 0xba4d69f8, 0x3cde2ac8, 0x3e815827, 0xbdf1d350, 0x3f37b809, 0xbf080d12, 0x3ecfa67e, 0xbe71f6ce, 0x3e97c4ba, 0x3ead03e9, 0xbf16a176, 0x3fa338b6, 0x3efa4984, 0x3ee18806, 0xbf0b2434, 0xbc3f9834, 0xbefcc41f, 0xbed45640, 0x3f00cd1f, 0x3e52b555, 0x3f2ab4b6, 0x3d3d75eb, 0x3e6e6999, 0x3d7e691b, 0x3e5685ee, 0xbea8cbc2, 0x3caa7067, 0xbe6c5fe0, 0xbf9cf3f3, 0x3f10ba8f, 0xbdb8f113, 0xbe23f3f5, 0x3e7110a8, 0x3f148b74, 0xbe9975d3, 0xbe02c00b, 0xbe402eb5, 0xbf00d772, 0x3e8ea7ee, 0x3d5d6385, 0x3f35f58a, 0x3dc92c6c, 0x3c04c1f1, 0x3e05d80e, 0xba8628b1, 0xbdeeb426, 0xbeae4c58, 0x3f0b254a, 0xbd605c01, 0x3d9a1cd1, 0xbebf9d20, 0x3f406faf, 0xbed82c78, 0x3eaf4061, 0xbf21015c }; static const uint32_t ref_sub[1024] = { 0xbec3bfec, 0xbec3bfec, 0xbcd9b659, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbec3bfec, 0xbcd9b659, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0x3f5eb58c, 0x3de75c6a, 0xbdd6ccd5, 0x3c7d3e8a, 0x3d2aa663, 0x3d4d58ff, 0xbdd54798, 0x3ea70e77, 0xbd297094, 0xbea565f3, 0xbe4e463c, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0x3f5eb58c, 0x3de75c6a, 0xbdd6ccd5, 0x3c7d3e8a, 0x3d2aa663, 0x3d4d58ff, 0xbdd54798, 0x3ea70e77, 0xbd297094, 0xbea565f3, 0xbe4e463c, 0xbe881495, 0xbd192500, 0x3ec632b3, 0x3d913548, 0xbd43eac0, 0xbe2a9afe, 0xbee4beda, 0xbe487519, 0x3cedfbd8, 0xbf6b3d5d, 0x3dd33a1f, 0xbec5674a, 0xbd9d318c, 0x3e9e21e4, 0x3f0bd12c, 0x3f23a0e0, 0xbc9837bb, 0xbef48381, 0xbee79933, 0xbca8ee65, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0x3f5eb58c, 0x3de75c6a, 0xbdd6ccd5, 0x3c7d3e8a, 0x3d2aa663, 0x3d4d58ff, 0xbdd54798, 0x3ea70e77, 0xbd297094, 0xbea565f3, 0xbe4e463c, 0xbe881495, 0xbd192500, 0x3ec632b3, 0x3d913548, 0xbd43eac0, 0xbe2a9afe, 0xbee4beda, 0xbe487519, 0x3cedfbd8, 0xbf6b3d5d, 0x3dd33a1f, 0xbec5674a, 0xbd9d318c, 0x3e9e21e4, 0x3f0bd12c, 0x3f23a0e0, 0xbc9837bb, 0xbef48381, 0xbee79933, 0xbca8ee65, 0xbdf32324, 0xbf261179, 0xbc8e7099, 0xbeb8ad58, 0xbef217ba, 0x3e6406b9, 0xbef685ba, 0x3e3a6325, 0xbee13c07, 0xbefa602b, 0xbee7ac04, 0xbcb023b6, 0xbc42949a, 0xbcc49b9c, 0xbf417e37, 0xbf1b071c, 0x3ef13e71, 0x3e2f1b19, 0xbbb6afb0, 0xbdb265d6, 0x3d133ff8, 0xbf2ec4a2, 0x3ed9b34c, 0x3f2af743, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0x3f5eb58c, 0x3de75c6a, 0xbdd6ccd5, 0x3c7d3e8a, 0x3d2aa663, 0x3d4d58ff, 0xbdd54798, 0x3ea70e77, 0xbd297094, 0xbea565f3, 0xbe4e463c, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0x3f5eb58c, 0x3de75c6a, 0xbdd6ccd5, 0x3c7d3e8a, 0x3d2aa663, 0x3d4d58ff, 0xbdd54798, 0x3ea70e77, 0xbd297094, 0xbea565f3, 0xbe4e463c, 0xbe881495, 0xbd192500, 0x3ec632b3, 0x3d913548, 0xbd43eac0, 0xbe2a9afe, 0xbee4beda, 0xbe487519, 0x3cedfbd8, 0xbf6b3d5d, 0x3dd33a1f, 0xbec5674a, 0xbd9d318c, 0x3e9e21e4, 0x3f0bd12c, 0x3f23a0e0, 0xbc9837bb, 0xbef48381, 0xbee79933, 0xbca8ee65, 0xbdf32324, 0xbf261179, 0xbc8e7099, 0xbeb8ad58, 0xbef217ba, 0x3e6406b9, 0xbef685ba, 0x3e3a6325, 0xbee13c07, 0xbefa602b, 0xbee7ac04, 0xbcb023b6, 0xbc42949a, 0xbcc49b9c, 0xbf417e37, 0xbf1b071c, 0x3ef13e71, 0x3e2f1b19, 0xbbb6afb0, 0xbdb265d6, 0x3d133ff8, 0xbf2ec4a2, 0x3ed9b34c, 0x3f2af743, 0xbec3bfec, 0xbcd9b659, 0xbe657fb6, 0xbea18f83, 0xbd28ef8d, 0x3ea7fb93, 0x3e1c44a9, 0xbefbf105, 0xbf55201b, 0xbf055053, 0xbc738651, 0xbf3759dd, 0xbf14b0f7, 0x3f06b2ea, 0xbedb7f47, 0xbe86771e, 0xbd7c62f8, 0x3def6d28, 0xbebfafa5, 0x3da2f68c, 0x3ee5086f, 0x3f25fdb8, 0x3e1287c1, 0xbd46c4b1, 0xbc850ff5, 0x3a418cee, 0xbe7adeb1, 0x3eeca261, 0xbe0f2f8e, 0xbe230912, 0x3d99bf79, 0xbe1722e8, 0x3d20fdb5, 0x3f5eb58c, 0x3de75c6a, 0xbdd6ccd5, 0x3c7d3e8a, 0x3d2aa663, 0x3d4d58ff, 0xbdd54798, 0x3ea70e77, 0xbd297094, 0xbea565f3, 0xbe4e463c, 0xbe881495, 0xbd192500, 0x3ec632b3, 0x3d913548, 0xbd43eac0, 0xbe2a9afe, 0xbee4beda, 0xbe487519, 0x3cedfbd8, 0xbf6b3d5d, 0x3dd33a1f, 0xbec5674a, 0xbd9d318c, 0x3e9e21e4, 0x3f0bd12c, 0x3f23a0e0, 0xbc9837bb, 0xbef48381, 0xbee79933, 0xbca8ee65, 0xbdf32324, 0xbf261179, 0xbc8e7099, 0xbeb8ad58, 0xbef217ba, 0x3e6406b9, 0xbef685ba, 0x3e3a6325, 0xbee13c07, 0xbefa602b, 0xbee7ac04, 0xbcb023b6, 0xbc42949a, 0xbcc49b9c, 0xbf417e37, 0xbf1b071c, 0x3ef13e71, 0x3e2f1b19, 0xbbb6afb0, 0xbdb265d6, 0x3d133ff8, 0xbf2ec4a2, 0x3ed9b34c, 0x3f2af743, 0x3c5e2fe7, 0xbf125cb8, 0xbcfdaadb, 0x3ea5bb2e, 0xbec281e6, 0x3dbbea20, 0x3e41029c, 0x3f8c9001, 0x3ba25a91, 0xbd342736, 0xbedb84f2, 0xbe175640, 0xbe59cd82, 0xbeb68c6d, 0xbedf1963, 0x3f326617, 0xbd0485b0, 0xbf13e60e, 0xbf161bee, 0xbf12491d, 0x3eacb49c, 0xbe8bc130, 0x3ef9e5ff, 0x3e209266, 0xbe8873a4, 0xbda37e5b, 0x3e2f454f, 0x3dc4c9d9, 0x3d247fff, 0x3ef3076c, 0x3ef68ca2, 0x3e05a000, 0x3e5436cb }; static const uint32_t ref_scale[1024] = { 0xbbaa6b72, 0xbbaa6b72, 0xbdd302a4, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbbaa6b72, 0xbdd302a4, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0x3e6b9f21, 0xbdcb4f45, 0xbde156ce, 0x3d7013c9, 0x3d0d01b9, 0xbc9a3282, 0xbd0b3c3b, 0x3db58ab4, 0xbe05359a, 0xbd51df27, 0xbd808231, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0x3e6b9f21, 0xbdcb4f45, 0xbde156ce, 0x3d7013c9, 0x3d0d01b9, 0xbc9a3282, 0xbd0b3c3b, 0x3db58ab4, 0xbe05359a, 0xbd51df27, 0xbd808231, 0xbe181764, 0x3d7610de, 0x3e1f995f, 0x3db5b545, 0xbd97e1ef, 0xbdde9075, 0xbd953249, 0xbdd64335, 0x3db82e6d, 0xbe4f2891, 0x3e2f94fa, 0xbc62e4f8, 0xbcdfdb23, 0xbd3a6d0e, 0x3dadc44b, 0x3e5c71a7, 0x3d13bf02, 0xbde1e7b2, 0xbe52d7ea, 0xbe052e10, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0x3e6b9f21, 0xbdcb4f45, 0xbde156ce, 0x3d7013c9, 0x3d0d01b9, 0xbc9a3282, 0xbd0b3c3b, 0x3db58ab4, 0xbe05359a, 0xbd51df27, 0xbd808231, 0xbe181764, 0x3d7610de, 0x3e1f995f, 0x3db5b545, 0xbd97e1ef, 0xbdde9075, 0xbd953249, 0xbdd64335, 0x3db82e6d, 0xbe4f2891, 0x3e2f94fa, 0xbc62e4f8, 0xbcdfdb23, 0xbd3a6d0e, 0x3dadc44b, 0x3e5c71a7, 0x3d13bf02, 0xbde1e7b2, 0xbe52d7ea, 0xbe052e10, 0xbda19e77, 0xbb82c9ac, 0xbb94dbe8, 0xbdaacaac, 0xbd617f26, 0x3cd63a22, 0x3d71d4b1, 0xbdb2e890, 0xbc0cac4b, 0xbe39adc9, 0xbd1fce94, 0x3da201ae, 0xbe19abc8, 0x3ea02647, 0xbd88b2e9, 0xbd290c64, 0xbc9427dc, 0x3d232195, 0xbdff9ede, 0xbe0077db, 0x3e0a011f, 0xbdf42e99, 0x3e8bc72e, 0x3e36cea2, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0x3e6b9f21, 0xbdcb4f45, 0xbde156ce, 0x3d7013c9, 0x3d0d01b9, 0xbc9a3282, 0xbd0b3c3b, 0x3db58ab4, 0xbe05359a, 0xbd51df27, 0xbd808231, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0x3e6b9f21, 0xbdcb4f45, 0xbde156ce, 0x3d7013c9, 0x3d0d01b9, 0xbc9a3282, 0xbd0b3c3b, 0x3db58ab4, 0xbe05359a, 0xbd51df27, 0xbd808231, 0xbe181764, 0x3d7610de, 0x3e1f995f, 0x3db5b545, 0xbd97e1ef, 0xbdde9075, 0xbd953249, 0xbdd64335, 0x3db82e6d, 0xbe4f2891, 0x3e2f94fa, 0xbc62e4f8, 0xbcdfdb23, 0xbd3a6d0e, 0x3dadc44b, 0x3e5c71a7, 0x3d13bf02, 0xbde1e7b2, 0xbe52d7ea, 0xbe052e10, 0xbda19e77, 0xbb82c9ac, 0xbb94dbe8, 0xbdaacaac, 0xbd617f26, 0x3cd63a22, 0x3d71d4b1, 0xbdb2e890, 0xbc0cac4b, 0xbe39adc9, 0xbd1fce94, 0x3da201ae, 0xbe19abc8, 0x3ea02647, 0xbd88b2e9, 0xbd290c64, 0xbc9427dc, 0x3d232195, 0xbdff9ede, 0xbe0077db, 0x3e0a011f, 0xbdf42e99, 0x3e8bc72e, 0x3e36cea2, 0xbbaa6b72, 0xbdd302a4, 0xbe051f28, 0xbd685867, 0x3d860969, 0x3d511a7e, 0xbda6a669, 0xbd98f3a1, 0xbe133111, 0xbe6bb5ca, 0x3da0f2dd, 0xbdd47c76, 0xbe30f580, 0xbe1e95cb, 0xbe562921, 0xbdee19ee, 0xbd29575d, 0xbdfe58ce, 0xbdf28c31, 0x3e66b5c8, 0x3e666649, 0x3d899e87, 0x3d808e8b, 0xbc65533c, 0x3c3df6a4, 0xbc3896e4, 0x3d7f7685, 0xbc34ee27, 0x3d4d3f72, 0xbe14cbe3, 0x3d4968ff, 0xbe6309ae, 0xbc997a4d, 0x3e6b9f21, 0xbdcb4f45, 0xbde156ce, 0x3d7013c9, 0x3d0d01b9, 0xbc9a3282, 0xbd0b3c3b, 0x3db58ab4, 0xbe05359a, 0xbd51df27, 0xbd808231, 0xbe181764, 0x3d7610de, 0x3e1f995f, 0x3db5b545, 0xbd97e1ef, 0xbdde9075, 0xbd953249, 0xbdd64335, 0x3db82e6d, 0xbe4f2891, 0x3e2f94fa, 0xbc62e4f8, 0xbcdfdb23, 0xbd3a6d0e, 0x3dadc44b, 0x3e5c71a7, 0x3d13bf02, 0xbde1e7b2, 0xbe52d7ea, 0xbe052e10, 0xbda19e77, 0xbb82c9ac, 0xbb94dbe8, 0xbdaacaac, 0xbd617f26, 0x3cd63a22, 0x3d71d4b1, 0xbdb2e890, 0xbc0cac4b, 0xbe39adc9, 0xbd1fce94, 0x3da201ae, 0xbe19abc8, 0x3ea02647, 0xbd88b2e9, 0xbd290c64, 0xbc9427dc, 0x3d232195, 0xbdff9ede, 0xbe0077db, 0x3e0a011f, 0xbdf42e99, 0x3e8bc72e, 0x3e36cea2, 0x3d7c4c97, 0xbe027626, 0x3d36d093, 0xbac424e0, 0xbdb7dae0, 0xbd0e6ad0, 0xbe84d3a0, 0x3ed4ed49, 0xbcaecb6a, 0xbd50fdc3, 0xbd45f93b, 0x3ddd6bc8, 0xbe032e4a, 0xbdf7ec72, 0xbe1f985f, 0x3d463a94, 0x3d7c2e71, 0xbe060fd6, 0x3cfecce4, 0xbdf24720, 0x3db0daab, 0xbd11aa51, 0x3df95fd6, 0x3c24e14c, 0xbe1b5ffe, 0x3ded6afd, 0x3cee5c9c, 0x3d2f7355, 0xbdab0d21, 0x3e9cf9b2, 0x3c730151, 0x3df21061, 0xbdd7e752 }; static const uint32_t ref_trans[1024] = { 0xbc2a6b72, 0xbc2a6b72, 0xbe5302a4, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbde85867, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbde85867, 0x3e060969, 0x3dd11a7e, 0xbe26a669, 0xbe18f3a1, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbde85867, 0x3e060969, 0x3dd11a7e, 0xbe26a669, 0xbe18f3a1, 0xbe933111, 0xbeebb5ca, 0x3e20f2dd, 0xbc2a6b72, 0xbe5302a4, 0xbc2a6b72, 0xbe851f28, 0xbe5302a4, 0xbde85867, 0xbc2a6b72, 0xbde85867, 0xbe5302a4, 0x3e060969, 0xbe851f28, 0x3dd11a7e, 0xbc2a6b72, 0x3e060969, 0xbe5302a4, 0x3dd11a7e, 0xbe851f28, 0xbe26a669, 0xbde85867, 0xbe18f3a1, 0xbc2a6b72, 0xbde85867, 0xbe5302a4, 0x3e060969, 0xbe851f28, 0x3dd11a7e, 0xbc2a6b72, 0xbe933111, 0xbe5302a4, 0xbeebb5ca, 0xbe851f28, 0x3e20f2dd, 0xbde85867, 0xbe547c76, 0x3e060969, 0xbeb0f580, 0x3dd11a7e, 0xbe9e95cb, 0xbe26a669, 0xbed62921, 0xbe18f3a1, 0xbe6e19ee, 0xbc2a6b72, 0xbe547c76, 0xbe5302a4, 0xbeb0f580, 0xbe851f28, 0xbe9e95cb, 0xbde85867, 0xbed62921, 0x3e060969, 0xbe6e19ee, 0x3dd11a7e, 0xbda9575d, 0xbe26a669, 0xbe7e58ce, 0xbe18f3a1, 0xbe728c31, 0xbe933111, 0x3ee6b5c8, 0xbeebb5ca, 0x3ee66649, 0x3e20f2dd, 0x3e099e87, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbc2a6b72, 0xbe851f28, 0x3e060969, 0xbe5302a4, 0xbde85867, 0x3dd11a7e, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbc2a6b72, 0x3e060969, 0xbe933111, 0xbe5302a4, 0x3dd11a7e, 0xbeebb5ca, 0xbe851f28, 0xbe26a669, 0x3e20f2dd, 0xbde85867, 0xbe18f3a1, 0xbe547c76, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbc2a6b72, 0xbe933111, 0xbda9575d, 0xbe5302a4, 0xbeebb5ca, 0xbe7e58ce, 0xbe851f28, 0x3e20f2dd, 0xbe728c31, 0xbde85867, 0xbe547c76, 0x3ee6b5c8, 0x3e060969, 0xbeb0f580, 0x3ee66649, 0x3dd11a7e, 0xbe9e95cb, 0x3e099e87, 0xbe26a669, 0xbed62921, 0x3e008e8b, 0xbe18f3a1, 0xbe6e19ee, 0xbce5533c, 0xbc2a6b72, 0xbe547c76, 0x3e008e8b, 0xbe5302a4, 0xbeb0f580, 0xbce5533c, 0xbe851f28, 0xbe9e95cb, 0x3cbdf6a4, 0xbde85867, 0xbed62921, 0xbcb896e4, 0x3e060969, 0xbe6e19ee, 0x3dff7685, 0x3dd11a7e, 0xbda9575d, 0xbcb4ee27, 0xbe26a669, 0xbe7e58ce, 0x3dcd3f72, 0xbe18f3a1, 0xbe728c31, 0xbe94cbe3, 0xbe933111, 0x3ee6b5c8, 0x3dc968ff, 0xbeebb5ca, 0x3ee66649, 0xbee309ae, 0x3e20f2dd, 0x3e099e87, 0xbd197a4d, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbde85867, 0xbc2a6b72, 0xbe851f28, 0x3e060969, 0xbe26a669, 0xbe5302a4, 0xbde85867, 0x3dd11a7e, 0xbe18f3a1, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbeebb5ca, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0x3e20f2dd, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbe547c76, 0xbc2a6b72, 0x3e060969, 0xbe933111, 0xbeb0f580, 0xbe5302a4, 0x3dd11a7e, 0xbeebb5ca, 0xbe9e95cb, 0xbe851f28, 0xbe26a669, 0x3e20f2dd, 0xbed62921, 0xbde85867, 0xbe18f3a1, 0xbe547c76, 0xbe6e19ee, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbeebb5ca, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0x3e20f2dd, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbe547c76, 0xbc2a6b72, 0xbe933111, 0xbda9575d, 0x3cbdf6a4, 0xbe5302a4, 0xbeebb5ca, 0xbe7e58ce, 0xbcb896e4, 0xbe851f28, 0x3e20f2dd, 0xbe728c31, 0x3dff7685, 0xbde85867, 0xbe547c76, 0x3ee6b5c8, 0xbcb4ee27, 0x3e060969, 0xbeb0f580, 0x3ee66649, 0x3dcd3f72, 0x3dd11a7e, 0xbe9e95cb, 0x3e099e87, 0xbe94cbe3, 0xbe26a669, 0xbed62921, 0x3e008e8b, 0x3dc968ff, 0xbe18f3a1, 0xbe6e19ee, 0xbce5533c, 0xbee309ae, 0xbc2a6b72, 0xbe547c76, 0x3e008e8b, 0x3eeb9f21, 0xbe5302a4, 0xbeb0f580, 0xbce5533c, 0xbe4b4f45, 0xbe851f28, 0xbe9e95cb, 0x3cbdf6a4, 0xbe6156ce, 0xbde85867, 0xbed62921, 0xbcb896e4, 0x3df013c9, 0x3e060969, 0xbe6e19ee, 0x3dff7685, 0x3d8d01b9, 0x3dd11a7e, 0xbda9575d, 0xbcb4ee27, 0xbd1a3282, 0xbe26a669, 0xbe7e58ce, 0x3dcd3f72, 0xbd8b3c3b, 0xbe18f3a1, 0xbe728c31, 0xbe94cbe3, 0x3e358ab4, 0xbe933111, 0x3ee6b5c8, 0x3dc968ff, 0xbe85359a, 0xbeebb5ca, 0x3ee66649, 0xbee309ae, 0xbdd1df27, 0x3e20f2dd, 0x3e099e87, 0xbd197a4d, 0xbe008231, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbc2a6b72, 0xbe851f28, 0x3e060969, 0xbe5302a4, 0xbde85867, 0x3dd11a7e, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbc2a6b72, 0x3e060969, 0xbe933111, 0xbe5302a4, 0x3dd11a7e, 0xbeebb5ca, 0xbe851f28, 0xbe26a669, 0x3e20f2dd, 0xbde85867, 0xbe18f3a1, 0xbe547c76, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbc2a6b72, 0xbe933111, 0xbda9575d, 0xbe5302a4, 0xbeebb5ca, 0xbe7e58ce, 0xbe851f28, 0x3e20f2dd, 0xbe728c31, 0xbde85867, 0xbe547c76, 0x3ee6b5c8, 0x3e060969, 0xbeb0f580, 0x3ee66649, 0x3dd11a7e, 0xbe9e95cb, 0x3e099e87, 0xbe26a669, 0xbed62921, 0x3e008e8b, 0xbe18f3a1, 0xbe6e19ee, 0xbce5533c, 0xbc2a6b72, 0xbe547c76, 0x3e008e8b, 0xbe5302a4, 0xbeb0f580, 0xbce5533c, 0xbe851f28, 0xbe9e95cb, 0x3cbdf6a4, 0xbde85867, 0xbed62921, 0xbcb896e4, 0x3e060969, 0xbe6e19ee, 0x3dff7685, 0x3dd11a7e, 0xbda9575d, 0xbcb4ee27, 0xbe26a669, 0xbe7e58ce, 0x3dcd3f72, 0xbe18f3a1, 0xbe728c31, 0xbe94cbe3, 0xbe933111, 0x3ee6b5c8, 0x3dc968ff, 0xbeebb5ca, 0x3ee66649, 0xbee309ae, 0x3e20f2dd, 0x3e099e87, 0xbd197a4d, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbde85867, 0x3e060969, 0x3dd11a7e, 0xbe26a669, 0xbe18f3a1, 0xbc2a6b72, 0xbe851f28, 0x3e060969, 0xbe26a669, 0xbe933111, 0x3e20f2dd, 0xbeb0f580, 0xbed62921, 0xbe5302a4, 0xbde85867, 0x3dd11a7e, 0xbe18f3a1, 0xbeebb5ca, 0xbe547c76, 0xbe9e95cb, 0xbe6e19ee, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbeebb5ca, 0xbeb0f580, 0xbe6e19ee, 0xbe728c31, 0x3e099e87, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0x3e20f2dd, 0xbe9e95cb, 0xbda9575d, 0x3ee6b5c8, 0x3e008e8b, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbe547c76, 0xbed62921, 0xbe7e58ce, 0x3ee66649, 0xbce5533c, 0xbc2a6b72, 0x3e060969, 0xbe933111, 0xbeb0f580, 0xbda9575d, 0x3ee66649, 0x3cbdf6a4, 0x3dcd3f72, 0xbe5302a4, 0x3dd11a7e, 0xbeebb5ca, 0xbe9e95cb, 0xbe7e58ce, 0x3e099e87, 0xbcb896e4, 0xbe94cbe3, 0xbe851f28, 0xbe26a669, 0x3e20f2dd, 0xbed62921, 0xbe728c31, 0x3e008e8b, 0x3dff7685, 0x3dc968ff, 0xbde85867, 0xbe18f3a1, 0xbe547c76, 0xbe6e19ee, 0x3ee6b5c8, 0xbce5533c, 0xbcb4ee27, 0xbee309ae, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbeebb5ca, 0xbeb0f580, 0xbe6e19ee, 0xbe728c31, 0x3e099e87, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0x3e20f2dd, 0xbe9e95cb, 0xbda9575d, 0x3ee6b5c8, 0x3e008e8b, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbe547c76, 0xbed62921, 0xbe7e58ce, 0x3ee66649, 0xbce5533c, 0xbc2a6b72, 0xbe933111, 0xbda9575d, 0x3cbdf6a4, 0xbd197a4d, 0x3e358ab4, 0xbe17e1ef, 0xbd5fdb23, 0xbe5302a4, 0xbeebb5ca, 0xbe7e58ce, 0xbcb896e4, 0x3eeb9f21, 0xbe85359a, 0xbe5e9075, 0xbdba6d0e, 0xbe851f28, 0x3e20f2dd, 0xbe728c31, 0x3dff7685, 0xbe4b4f45, 0xbdd1df27, 0xbe153249, 0x3e2dc44b, 0xbde85867, 0xbe547c76, 0x3ee6b5c8, 0xbcb4ee27, 0xbe6156ce, 0xbe008231, 0xbe564335, 0x3edc71a7, 0x3e060969, 0xbeb0f580, 0x3ee66649, 0x3dcd3f72, 0x3df013c9, 0xbe981764, 0x3e382e6d, 0x3d93bf02, 0x3dd11a7e, 0xbe9e95cb, 0x3e099e87, 0xbe94cbe3, 0x3d8d01b9, 0x3df610de, 0xbecf2891, 0xbe61e7b2, 0xbe26a669, 0xbed62921, 0x3e008e8b, 0x3dc968ff, 0xbd1a3282, 0x3e9f995f, 0x3eaf94fa, 0xbed2d7ea, 0xbe18f3a1, 0xbe6e19ee, 0xbce5533c, 0xbee309ae, 0xbd8b3c3b, 0x3e35b545, 0xbce2e4f8, 0xbe852e10, 0xbc2a6b72, 0xbe547c76, 0x3e008e8b, 0x3eeb9f21, 0xbe981764, 0xbce2e4f8, 0xbc14dbe8, 0x3f202647, 0xbe5302a4, 0xbeb0f580, 0xbce5533c, 0xbe4b4f45, 0x3df610de, 0xbd5fdb23, 0xbe2acaac, 0xbe08b2e9, 0xbe851f28, 0xbe9e95cb, 0x3cbdf6a4, 0xbe6156ce, 0x3e9f995f, 0xbdba6d0e, 0xbde17f26, 0xbda90c64, 0xbde85867, 0xbed62921, 0xbcb896e4, 0x3df013c9, 0x3e35b545, 0x3e2dc44b, 0x3d563a22, 0xbd1427dc, 0x3e060969, 0xbe6e19ee, 0x3dff7685, 0x3d8d01b9, 0xbe17e1ef, 0x3edc71a7, 0x3df1d4b1, 0x3da32195, 0x3dd11a7e, 0xbda9575d, 0xbcb4ee27, 0xbd1a3282, 0xbe5e9075, 0x3d93bf02, 0xbe32e890, 0xbe7f9ede, 0xbe26a669, 0xbe7e58ce, 0x3dcd3f72, 0xbd8b3c3b, 0xbe153249, 0xbe61e7b2, 0xbc8cac4b, 0xbe8077db, 0xbe18f3a1, 0xbe728c31, 0xbe94cbe3, 0x3e358ab4, 0xbe564335, 0xbed2d7ea, 0xbeb9adc9, 0x3e8a011f, 0xbe933111, 0x3ee6b5c8, 0x3dc968ff, 0xbe85359a, 0x3e382e6d, 0xbe852e10, 0xbd9fce94, 0xbe742e99, 0xbeebb5ca, 0x3ee66649, 0xbee309ae, 0xbdd1df27, 0xbecf2891, 0xbe219e77, 0x3e2201ae, 0x3f0bc72e, 0x3e20f2dd, 0x3e099e87, 0xbd197a4d, 0xbe008231, 0x3eaf94fa, 0xbc02c9ac, 0xbe99abc8, 0x3eb6cea2, 0xbc2a6b72, 0xbe5302a4, 0xbe851f28, 0xbde85867, 0x3e060969, 0x3dd11a7e, 0xbe26a669, 0xbe18f3a1, 0xbe933111, 0xbeebb5ca, 0x3e20f2dd, 0xbc2a6b72, 0xbe851f28, 0x3e060969, 0xbe26a669, 0xbe933111, 0x3e20f2dd, 0xbeb0f580, 0xbed62921, 0xbda9575d, 0xbe728c31, 0x3ee66649, 0xbe5302a4, 0xbde85867, 0x3dd11a7e, 0xbe18f3a1, 0xbeebb5ca, 0xbe547c76, 0xbe9e95cb, 0xbe6e19ee, 0xbe7e58ce, 0x3ee6b5c8, 0x3e099e87, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbeebb5ca, 0xbeb0f580, 0xbe6e19ee, 0xbe728c31, 0x3e099e87, 0x3cbdf6a4, 0xbcb4ee27, 0x3dc968ff, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0x3e20f2dd, 0xbe9e95cb, 0xbda9575d, 0x3ee6b5c8, 0x3e008e8b, 0xbcb896e4, 0x3dcd3f72, 0xbee309ae, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbe547c76, 0xbed62921, 0xbe7e58ce, 0x3ee66649, 0xbce5533c, 0x3dff7685, 0xbe94cbe3, 0xbd197a4d, 0xbc2a6b72, 0x3e060969, 0xbe933111, 0xbeb0f580, 0xbda9575d, 0x3ee66649, 0x3cbdf6a4, 0x3dcd3f72, 0xbd197a4d, 0x3df013c9, 0x3e358ab4, 0xbe5302a4, 0x3dd11a7e, 0xbeebb5ca, 0xbe9e95cb, 0xbe7e58ce, 0x3e099e87, 0xbcb896e4, 0xbe94cbe3, 0x3eeb9f21, 0x3d8d01b9, 0xbe85359a, 0xbe851f28, 0xbe26a669, 0x3e20f2dd, 0xbed62921, 0xbe728c31, 0x3e008e8b, 0x3dff7685, 0x3dc968ff, 0xbe4b4f45, 0xbd1a3282, 0xbdd1df27, 0xbde85867, 0xbe18f3a1, 0xbe547c76, 0xbe6e19ee, 0x3ee6b5c8, 0xbce5533c, 0xbcb4ee27, 0xbee309ae, 0xbe6156ce, 0xbd8b3c3b, 0xbe008231, 0xbc2a6b72, 0xbde85867, 0xbe26a669, 0xbeebb5ca, 0xbeb0f580, 0xbe6e19ee, 0xbe728c31, 0x3e099e87, 0x3cbdf6a4, 0xbcb4ee27, 0x3dc968ff, 0xbe5302a4, 0x3e060969, 0xbe18f3a1, 0x3e20f2dd, 0xbe9e95cb, 0xbda9575d, 0x3ee6b5c8, 0x3e008e8b, 0xbcb896e4, 0x3dcd3f72, 0xbee309ae, 0xbe851f28, 0x3dd11a7e, 0xbe933111, 0xbe547c76, 0xbed62921, 0xbe7e58ce, 0x3ee66649, 0xbce5533c, 0x3dff7685, 0xbe94cbe3, 0xbd197a4d, 0xbc2a6b72, 0xbe933111, 0xbda9575d, 0x3cbdf6a4, 0xbd197a4d, 0x3e358ab4, 0xbe17e1ef, 0xbd5fdb23, 0xbe219e77, 0xbc8cac4b, 0xbd1427dc, 0xbe5302a4, 0xbeebb5ca, 0xbe7e58ce, 0xbcb896e4, 0x3eeb9f21, 0xbe85359a, 0xbe5e9075, 0xbdba6d0e, 0xbc02c9ac, 0xbeb9adc9, 0x3da32195, 0xbe851f28, 0x3e20f2dd, 0xbe728c31, 0x3dff7685, 0xbe4b4f45, 0xbdd1df27, 0xbe153249, 0x3e2dc44b, 0xbc14dbe8, 0xbd9fce94, 0xbe7f9ede, 0xbde85867, 0xbe547c76, 0x3ee6b5c8, 0xbcb4ee27, 0xbe6156ce, 0xbe008231, 0xbe564335, 0x3edc71a7, 0xbe2acaac, 0x3e2201ae, 0xbe8077db, 0x3e060969, 0xbeb0f580, 0x3ee66649, 0x3dcd3f72, 0x3df013c9, 0xbe981764, 0x3e382e6d, 0x3d93bf02, 0xbde17f26, 0xbe99abc8, 0x3e8a011f, 0x3dd11a7e, 0xbe9e95cb, 0x3e099e87, 0xbe94cbe3, 0x3d8d01b9, 0x3df610de, 0xbecf2891, 0xbe61e7b2, 0x3d563a22, 0x3f202647, 0xbe742e99, 0xbe26a669, 0xbed62921, 0x3e008e8b, 0x3dc968ff, 0xbd1a3282, 0x3e9f995f, 0x3eaf94fa, 0xbed2d7ea, 0x3df1d4b1, 0xbe08b2e9, 0x3f0bc72e, 0xbe18f3a1, 0xbe6e19ee, 0xbce5533c, 0xbee309ae, 0xbd8b3c3b, 0x3e35b545, 0xbce2e4f8, 0xbe852e10, 0xbe32e890, 0xbda90c64, 0x3eb6cea2, 0xbc2a6b72, 0xbe547c76, 0x3e008e8b, 0x3eeb9f21, 0xbe981764, 0xbce2e4f8, 0xbc14dbe8, 0x3f202647, 0x3dfc4c97, 0x3e5d6bc8, 0x3e795fd6, 0xbe5302a4, 0xbeb0f580, 0xbce5533c, 0xbe4b4f45, 0x3df610de, 0xbd5fdb23, 0xbe2acaac, 0xbe08b2e9, 0xbe827626, 0xbe832e4a, 0x3ca4e14c, 0xbe851f28, 0xbe9e95cb, 0x3cbdf6a4, 0xbe6156ce, 0x3e9f995f, 0xbdba6d0e, 0xbde17f26, 0xbda90c64, 0x3db6d093, 0xbe77ec72, 0xbe9b5ffe, 0xbde85867, 0xbed62921, 0xbcb896e4, 0x3df013c9, 0x3e35b545, 0x3e2dc44b, 0x3d563a22, 0xbd1427dc, 0xbb4424e0, 0xbe9f985f, 0x3e6d6afd, 0x3e060969, 0xbe6e19ee, 0x3dff7685, 0x3d8d01b9, 0xbe17e1ef, 0x3edc71a7, 0x3df1d4b1, 0x3da32195, 0xbe37dae0, 0x3dc63a94, 0x3d6e5c9c, 0x3dd11a7e, 0xbda9575d, 0xbcb4ee27, 0xbd1a3282, 0xbe5e9075, 0x3d93bf02, 0xbe32e890, 0xbe7f9ede, 0xbd8e6ad0, 0x3dfc2e71, 0x3daf7355, 0xbe26a669, 0xbe7e58ce, 0x3dcd3f72, 0xbd8b3c3b, 0xbe153249, 0xbe61e7b2, 0xbc8cac4b, 0xbe8077db, 0xbf04d3a0, 0xbe860fd6, 0xbe2b0d21, 0xbe18f3a1, 0xbe728c31, 0xbe94cbe3, 0x3e358ab4, 0xbe564335, 0xbed2d7ea, 0xbeb9adc9, 0x3e8a011f, 0x3f54ed49, 0x3d7ecce4, 0x3f1cf9b2, 0xbe933111, 0x3ee6b5c8, 0x3dc968ff, 0xbe85359a, 0x3e382e6d, 0xbe852e10, 0xbd9fce94, 0xbe742e99, 0xbd2ecb6a, 0xbe724720, 0x3cf30151, 0xbeebb5ca, 0x3ee66649, 0xbee309ae, 0xbdd1df27, 0xbecf2891, 0xbe219e77, 0x3e2201ae, 0x3f0bc72e, 0xbdd0fdc3, 0x3e30daab, 0x3e721061, 0x3e20f2dd, 0x3e099e87, 0xbd197a4d, 0xbe008231, 0x3eaf94fa, 0xbc02c9ac, 0xbe99abc8, 0x3eb6cea2, 0xbdc5f93b, 0xbd91aa51, 0xbe57e752 }; static const uint32_t ref_inv[3111] = { 0x40000000, 0x3f3504f3, 0xbf3504f3, 0x3f3504f3, 0x3f3504f3, 0x3f4e0352, 0x3f01814a, 0xbe9f093a, 0xbe9f093a, 0x3f4e0352, 0x3f01814a, 0x3f01814a, 0xbe9f093a, 0x3f4e0352, 0xc0d00000, 0x3fc00000, 0x3f000000, 0x3f400000, 0x3fc00000, 0x3f000000, 0xbf000000, 0xbe800000, 0x3f000000, 0xbf000000, 0x3f000000, 0xbe800000, 0x3f400000, 0xbe800000, 0xbe800000, 0x3e000000, 0x3fa71f0a, 0xc024b4eb, 0xc05f3ba9, 0xbf83216a, 0x404771e8, 0x4056e407, 0x40356297, 0xbe4498f6, 0xbf4b5e27, 0x400549d0, 0xbe6fcb43, 0xbf8400c9, 0xbf9e549e, 0x3fa8b724, 0xbef7291f, 0x40072f7e, 0x40607b10, 0x3fbc1218, 0xc06e19c8, 0xc02c7dd9, 0xc0594240, 0x3f1ce0f6, 0xbfbf9132, 0xc06d1721, 0xbfe9a787, 0x405326f3, 0x40829b17, 0x3ff50fb6, 0x3f47a280, 0x3fa91ebb, 0xbe0907fe, 0xbf378a5b, 0xbe7dffb8, 0xbfb0f633, 0xbdb24389, 0xbfacad61, 0xbeb01e26, 0x3ff58016, 0x3fe462dd, 0xbe3063b1, 0xbec6efd4, 0xbfd717f9, 0x3d7ba261, 0x3f41473b, 0xbfaf1372, 0x3cb5ee56, 0x3f19d7aa, 0xbeb5f04f, 0x3fc56188, 0x3f806427, 0xc086c5a5, 0x3fa65d3f, 0x3fab47a9, 0xbf5f049a, 0x3fc3b00c, 0x3f26979d, 0xbe87399e, 0x3febcae2, 0xc0ab7d84, 0x401f9894, 0x40197fcc, 0xbfc2c95d, 0x3fe632b4, 0xbf0beb47, 0xbf71c501, 0x3ec24fb5, 0xbf70d0a1, 0x3ef475ec, 0x3e1d2735, 0x3f29eedc, 0xbe3c8e43, 0xbeea9a81, 0xbd9846d3, 0xbd6162b7, 0x406eb046, 0xc00c8df9, 0xbf526bd6, 0x3ddf191e, 0xbf7e1605, 0x3e0e0ecf, 0x3f23e196, 0xbf6e4977, 0xc0771057, 0x40440402, 0x3f85a1d0, 0xbf74272e, 0x3f6fd0f5, 0xbe9e90e6, 0x3f89a477, 0x3e8e25ad, 0xc01e72a1, 0x3febfccf, 0xbf273bf6, 0xbf8e37da, 0x4007a35a, 0xbebc74ad, 0x3ea3a593, 0x3eb25d83, 0x3e8eea86, 0x3f042e1b, 0xbfb1f458, 0xbd2dc65d, 0xbe85ec0f, 0x3f240d8c, 0xbf12dccf, 0xbffaed7c, 0x4114a50e, 0xc0a1f9ce, 0xbfc59520, 0x4036a0a6, 0xc04239c8, 0x3eac85e3, 0x3e64be65, 0x3f3b0f94, 0x3fc65caa, 0xbf8b38ce, 0xbf9a24ad, 0x3f335170, 0x3f4e473e, 0x3eaf7bc7, 0xc0086d60, 0x3ef6fc79, 0xbf3d4b54, 0xbef376d0, 0x3f29293f, 0xbf2a5ccb, 0x3f57ef6d, 0x3cb437cf, 0x3e54345f, 0x3dcbec1c, 0x3ebf7bd5, 0x3fc699e8, 0xbee1632f, 0x3f36baad, 0x3f85a102, 0xbfe4c8dd, 0xbfa8d90e, 0xbef4f590, 0x3f535ce5, 0x3cd34d37, 0xc03dd8fc, 0xc0238a73, 0xbe706b58, 0xbfe2c01c, 0x4091de83, 0x405c3eac, 0x3f3f4db5, 0xbfb58767, 0x3f96dbb2, 0xbff8df9f, 0xc00577c2, 0x3d495a14, 0xbf34829a, 0x40171170, 0x3fb86088, 0x3fbdccbf, 0xbefb8cbf, 0x3f14440b, 0x3fdc4b70, 0xbeefa339, 0x3f9638c0, 0x3fe98053, 0xc00cc38e, 0xc00fb8ee, 0xbf1c4c76, 0x403cf71f, 0xbff33cd7, 0x3f43ffe6, 0x3fad3b27, 0xbf06010d, 0x3fe9b6b1, 0xbfcd537b, 0xc01510c8, 0xbf38f46a, 0x3faf377c, 0xbf3fa19c, 0x3eacdf61, 0x3f9a73c3, 0xbfdbefdb, 0xbfb3850d, 0x3e8e3df9, 0x3fae0452, 0x3d947b6b, 0xbfb73d9a, 0x3fb07941, 0x3ea52b28, 0x3f9943b6, 0x3f4b827a, 0x3f80af53, 0xbff9107e, 0xbf2665e1, 0xbe48474a, 0x3e3c00f8, 0xbf3457a1, 0x3f2cd252, 0x40264169, 0xc01d84f2, 0xbb848125, 0x3eba7bc8, 0x3ea33596, 0x3f7d6e09, 0x3e2c5a1d, 0xc0266f6e, 0x3f165ca6, 0xc001af22, 0x3eabdc90, 0xbed67f76, 0x3f2350ef, 0x4028f1e7, 0x3f23d327, 0x3ff93f7a, 0xbdcbbf15, 0xbe86bc38, 0xbe7b5aa6, 0xbe918458, 0xbed79582, 0xbe2354a3, 0xbfa0e82e, 0xbf38c7f0, 0x3e7594d1, 0x3ef50ba7, 0xbe101ace, 0x3e98345d, 0x3f7b83ca, 0x3f133dea, 0x40b4a00e, 0xc048415d, 0xbfd19389, 0x3ee48e96, 0xbf3648bd, 0x3f830975, 0x3f487c73, 0xc0b786e1, 0xbc8db932, 0xc06b338e, 0x3f4f6e9d, 0x3f34fd30, 0x40042362, 0x40be9819, 0x3bda674c, 0x3fcc85a1, 0xbfb3e9a2, 0xbeaaca12, 0xbf1d2911, 0xbf74f46d, 0x3f4a3417, 0x3faf18bc, 0xbfbc7448, 0x3f1e904f, 0xc033d729, 0x3e85725b, 0x3e7d38cb, 0x3f7081bc, 0x3feab56b, 0x3f6818ca, 0x408644a9, 0xc0742ac7, 0xbfa31c4a, 0x3eaa1213, 0x3e70872f, 0x3fbee1cd, 0x3f96b94e, 0xc0984721, 0x3e271581, 0xc03e4dcf, 0x3f1688ef, 0xbe151a13, 0x3f9c1ead, 0x40b26826, 0x3ddcb075, 0xc0c73825, 0x4067cbed, 0x3f0fbda2, 0xbdb2aff8, 0x3f215acf, 0xbfdc4c33, 0xbf456a38, 0x40c22b11, 0x3f2968cc, 0x408b2b73, 0xbf4c70be, 0xbf19c1ef, 0xc037eb4f, 0xc0c8a4ca, 0xbeb401ad, 0xc02a46e9, 0x3fb50f9a, 0x3eadc581, 0xbe0b79e1, 0x3f37e47c, 0xbf9c09f8, 0xbf2fab13, 0x4045396f, 0x3f0171d6, 0x40049d86, 0xbe2673d8, 0x3e04a9e8, 0xbfa52d62, 0xc03f2e4b, 0xbe9843ba, 0xc0045fa2, 0x3f2a2271, 0xbf517e62, 0x3f62aa2e, 0x3f51e7c2, 0xbf3898b4, 0xbebc6595, 0x400ae3fe, 0x3f14c160, 0x3f746217, 0x3d3a27c7, 0xbe39a50d, 0xbfe4678a, 0xbf13130f, 0xbf2e74f2, 0x3eb6ff81, 0x3fca8efb, 0x3f3854b6, 0xbe6d2c6b, 0xbe9d406a, 0x3e4371c7, 0x3d2bdfe5, 0xbefe5a0e, 0xbf8c0524, 0x3f82415e, 0xbf4ec6c2, 0xbe6a04a7, 0x3f7c4df9, 0xbf3882f9, 0x3f74419b, 0x3f51490d, 0xbfc60544, 0xbf4b6467, 0x3eb0f8a7, 0x3f228128, 0x3ece849d, 0x3f13de40, 0xbfa9654b, 0x3be2b187, 0xbfcf2d60, 0x3ebb44d1, 0x3f06a7d2, 0xbeac4535, 0x3fcd1827, 0xbf8aae86, 0xbfccc443, 0x4000bafd, 0x3f9c856f, 0xbf533767, 0xbe35b7af, 0xbcae7fc5, 0xbf6f9ed7, 0x3fe7f8f1, 0xbecdf7a7, 0x3f9839d9, 0x3daef4d8, 0xbe4e3f2c, 0x3f5a5669, 0xc024f1bb, 0xbf145654, 0x3fc24a40, 0xbf035891, 0x3f79997e, 0xbe76b520, 0xbf23fe6c, 0x3f00041e, 0x3cf84e6d, 0xbfb77f10, 0xbf12a88c, 0xbf25718b, 0x3f530718, 0x3e870a19, 0x3faaa531, 0x3dd961eb, 0x3f170e11, 0xbfd09910, 0x3e41b8ea, 0x3e40b217, 0xbd853417, 0x3c87c413, 0xbe9083dd, 0x3f1d7047, 0x3f623b92, 0x3eeb9eae, 0x3ea27b19, 0xbf3ad886, 0x3ea638cf, 0xbf8f90a2, 0xbebba1bf, 0xbe044f6d, 0x3f3e2424, 0xbf15ddfb, 0x3f408c93, 0x3e76c974, 0xbf04551b, 0x3e370516, 0x3e924cab, 0xbf19f926, 0xbe959dc2, 0xbf275166, 0xbf07e5f1, 0xbe60cde7, 0x3f9271d7, 0x3f2c31bd, 0xbfcf1dcc, 0xc01a6711, 0x406d2169, 0x3f77e63f, 0xbea0d57e, 0xbf1f0d85, 0xbeab47ec, 0xbfcfd840, 0x4053e902, 0xbfa96f9c, 0x405dc89d, 0xbf0b60f6, 0x3e50d79d, 0xbd8f9840, 0xc0852a68, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0xbf1a7a2b, 0x3dec2954, 0xbec36915, 0x3d826be1, 0x3f31efe1, 0x3e91c159, 0x3e9c4d91, 0x3f71cafc, 0xbedec145, 0xbe911358, 0x3dc86f98, 0x3e5eeeda, 0xbc908aad, 0xbe468dcb, 0xbedfa73e, 0xbe1eee9f, 0xbefaece0, 0x3ef48882, 0xbeb53cbd, 0x3e76b5ce, 0x3e8102a2, 0xbfd17158, 0x3cb959bf, 0x3f3f3482, 0x3e3d2c10, 0x3edd2dac, 0xbe82f006, 0xbf6dae37, 0x3ec0ad18, 0x3ec1dc5a, 0x3dd74142, 0x3f10cb84, 0x3e0b5580, 0xbf2a1d53, 0xbe2246cb, 0xbf36df66, 0xbee93dac, 0x3e839655, 0x3e80e69f, 0x3f6e714a, 0xbe2ce8fc, 0x3f2876c3, 0x3f542960, 0xbf654cca, 0xbe6627de, 0x3fabf803, 0x3eeaa3cd, 0x3d1976d7, 0x3d8b57aa, 0xbdee0401, 0xc00b0847, 0x3e393b1d, 0x3cc9b52b, 0x3eaa5c48, 0xbda1c632, 0xbe832b35, 0xbe4a6399, 0x3e198c0e, 0xbe4d54b0, 0xbe9deef7, 0x3f5822a1, 0x3e91ad40, 0xbf449113, 0xbecebc53, 0xbeea040b, 0x3ecea8e4, 0xbda8ef0d, 0x3f456e30, 0xbed6e3a3, 0xbee3b2c5, 0x3e13950e, 0xbed28013, 0x3f58d048, 0x3f5296dd, 0xbe66e82e, 0x3f14e7a7, 0x3e07eae0, 0xbeb64497, 0xbdec639b, 0x3f0f0392, 0xbf0100db, 0x3edc6504, 0xbe6461c3, 0x3decf550, 0xbf882c4f, 0xbf3c96eb, 0xbf030f55, 0xbf7c9b15, 0xbdf8bf55, 0x3ea13829, 0x3f4c69e4, 0x3e7256cc, 0x3f61e7f7, 0xbe84217e, 0xbe8042a9, 0x3e28ac9b, 0x3e793513, 0x3f313b4a, 0xbe327f61, 0xbe992aa0, 0x3d56a840, 0xbe6c4faf, 0x3fa90e2e, 0x3e92ffa6, 0x3f5218c8, 0x3f43b31d, 0xbfd484e2, 0xbf9456b0, 0x3e175d26, 0xbf8b0225, 0xbf14bc58, 0x3d85c90b, 0xbf04126a, 0xbe83ace2, 0xbee3cab9, 0x3edc9d8f, 0x3f83b54b, 0x3f0c6285, 0x3f38b44a, 0xbebc7f89, 0xbedb06b2, 0xbf820ba9, 0xbf834984, 0x3fa6ba19, 0x3f14f306, 0x3e5a61a2, 0x3f680314, 0x3e109119, 0x3e962080, 0x3fb9ecfe, 0xbf699a5f, 0x3de5f178, 0xbf7a114a, 0xbfb1941f, 0x3ef6f71e, 0x3f3982ed, 0xbd3dc5f3, 0x3f2f7390, 0x3dceffaf, 0x3e331348, 0x3e6fbe3d, 0xbed0b1c3, 0xbc8870e2, 0xbf4a8c21, 0xbd92b3bd, 0x3eaf8a14, 0xbd9bf4f5, 0xbe88a029, 0x3e0a15d1, 0x3e694aa0, 0x3d2dbb6c, 0x3d74221b, 0x3da224c7, 0xbec2ac5c, 0x3c927a7b, 0xbe2004c4, 0xbe24a87e, 0x3e270756, 0x3f048d62, 0xbcf2d45a, 0x3e0dde41, 0x3ec1b138, 0xbf0842a1, 0x3ea09d70, 0xbd032593, 0xbbfc3c93, 0xbf305159, 0xbb3c9eb0, 0x3ef69413, 0x3c2bb592, 0x3ecbad16, 0x3c1e58ae, 0x3e5bdbec, 0xbd85f51a, 0xbe83e2ef, 0xbf4ddd33, 0xbf0a0060, 0xbeb014c0, 0x3ee40039, 0x3f6228df, 0xbe59a5c8, 0x3da0cf6f, 0x3e535523, 0xbcca90a6, 0xbdee1f84, 0xbe140e69, 0x3f45f26f, 0xbeb0f8e2, 0xbec5b7bc, 0xbed4d159, 0xbf81cbf3, 0x3f0c02dd, 0xbd87dc9b, 0x3f424151, 0x3ed9659c, 0x3e633841, 0x3e0aa2b2, 0x3ec2e8a7, 0xbe75b325, 0xbe6b0e2d, 0xbf05d74a, 0xbe31b8a9, 0x3e64fa15, 0x3f2b6c4e, 0xbef4ad06, 0xbebb1a07, 0x3dc18532, 0xbe249e5e, 0x3f4596a1, 0x3ec5c766, 0xbddc1718, 0xbe019651, 0x3e33041e, 0xbf05d752, 0x3ef9a2e6, 0x3deb9b37, 0x3f46b71c, 0xbed209e2, 0xbf468466, 0x3ea61e1b, 0x3e538c55, 0x3f0a35ff, 0x3ec04f7f, 0x3eb1a321, 0x3fb090a8, 0xbf9b4217, 0xbeb76e99, 0x3e25bf07, 0xbf4b1698, 0xbf2d24a7, 0xbe486fd6, 0xbf934412, 0x3d3c80dc, 0xbed0e325, 0x3f8f8673, 0x3f642dc4, 0xbef05bbf, 0x3e5ddf4e, 0xbe46d534, 0x3eb3c12b, 0xbef9948b, 0xbf6ffc0f, 0x3ff195ab, 0x3ea2669e, 0xbf29dac8, 0x3f4897de, 0x3d53d7be, 0x3ed81d81, 0x3f004b7e, 0xbe2d69a9, 0x3e46668c, 0xbec9cf6c, 0xbf3b6658, 0xbf09c97a, 0xbe11625b, 0x3e5e267d, 0x3f5ff073, 0x3f075969, 0xbe65097a, 0xbed1d7db, 0xbe687b60, 0xbecda0f6, 0xbf2c0c52, 0xbdbffb81, 0x3f264cc6, 0x3d059927, 0x3de1c70a, 0xbf4b90d6, 0x3f1721cf, 0x3e7ce237, 0xbf22aa11, 0x3eaaefc7, 0x3d1fbf7b, 0x3f28885c, 0x3f69cd57, 0x3f8c9019, 0xbecdbef9, 0xbf2869f8, 0xbf37368f, 0xbf4c4f5a, 0xbe29d4b5, 0xbefb8067, 0xbe6d7b81, 0xbb85c7f0, 0x3d0e87eb, 0x3f8e8edf, 0x3f2239db, 0xbf155dff, 0xbe9d21de, 0x3fbc68a4, 0xbf97997c, 0xbfb11182, 0x3f3155d9, 0xc01ab02b, 0x3b430f43, 0x4028d83d, 0xbdf78222, 0xbf6ca1be, 0xbf82628f, 0xbfab446e, 0x3fb1675a, 0xbfd42116, 0xbf873930, 0xbedc0d91, 0xbfd10cbf, 0x3fa9662f, 0x3e14fa9e, 0x3fa593f2, 0xbe689706, 0xbfd7fdd6, 0xbfab4d0e, 0x3e91761d, 0xbf4629cd, 0xbf85e11a, 0x3f277b6d, 0x401071cb, 0x3fa2a82f, 0x3fa3fa8e, 0x3f55af3c, 0x3fa85e8f, 0x3f786928, 0x40ba5120, 0xc03c8013, 0xc038e3a2, 0x3f9e457a, 0xc0efe39e, 0xbebe0c2f, 0x4107be95, 0xbf13c6af, 0xc023d3e1, 0xbfcdd678, 0xc05bf523, 0x408fa3ec, 0xc0bf0229, 0xbf9409ea, 0xc0316037, 0xc09c60bb, 0x3fa7d270, 0xbf0c61fb, 0x4081d503, 0xbfdc40f0, 0xc0c34d44, 0xc0187207, 0x3ec1c238, 0xc0699fd9, 0xc013de94, 0x3fdc1ad1, 0x40cdcac7, 0x4060d804, 0x40671556, 0x40315110, 0x40c1a746, 0x4004f365, 0x40674fe5, 0xc022d5f5, 0xbfe151ad, 0x3f80da5d, 0xc0b8ccd8, 0x3d6098e5, 0x40a553b4, 0xbf444915, 0xc0053982, 0xbfac2968, 0xc019e812, 0x4034f887, 0xc05c73da, 0xbf9677b7, 0xbfe60ac8, 0xc06f8887, 0x3fc770c5, 0xbe0f1b86, 0x404e8472, 0xbf592037, 0xc08d3aa2, 0xbff0a7e1, 0x3e974e1c, 0xbff31473, 0xc0085fce, 0x3f827c22, 0x4089fe93, 0x4036a323, 0x4016a5fe, 0x40267fe0, 0x408cccfd, 0x3fd2e30b, 0x3eff6a7a, 0x3dc81108, 0x3e17d0e6, 0xbdd28677, 0x3efcf02e, 0xbef17b19, 0xbe58c53c, 0x3eac8340, 0x3f368329, 0x3e09149a, 0x3dea4959, 0x3ef6cf7d, 0xbf144054, 0x3ec72bbc, 0x3ea63850, 0x3e8eb181, 0xbf31f636, 0x3e8ab1a5, 0xbd3fffe3, 0xbf6d189c, 0x3f356b3f, 0x3ec38e2a, 0x3d884673, 0x3ed886be, 0x3e10dcbc, 0xbe314ffb, 0xbf21b8bd, 0xbf825c18, 0xbd8fc1e4, 0xbd69e302, 0xbd85c261, 0xbea2db2d, 0x4110709b, 0xc0afec84, 0xc0a00768, 0x401ac062, 0xc15ff1d1, 0xbe8f247c, 0x415b26a5, 0xbfab7979, 0xc0a9aa51, 0xc04c2b0b, 0xc0c76b7b, 0x40eaa79f, 0xc10c5708, 0xc049454c, 0xc084faa3, 0xc105994e, 0x4069e38c, 0xbf5d5d65, 0x40f88779, 0xbff8a2dc, 0xc12e1f34, 0xc0ab662a, 0x3ef4312e, 0xc0b226d4, 0xc0a7486e, 0x405bd9c8, 0x4131a53b, 0x40d97adc, 0x40c40086, 0x40a9b9c5, 0x412a4e72, 0x408c81c1, 0xbfacbc69, 0x3f9dbf54, 0x3fbc162c, 0xbf72930f, 0x40837526, 0xbd653696, 0xc040f244, 0x3e5ecd6f, 0x401aa30d, 0x3f76d85f, 0x3fa81fc6, 0xbf8c7ce2, 0x3fae3123, 0x3f9870cd, 0x3f84483e, 0x4019a9a6, 0xbfcbcf82, 0x3f251363, 0xbff3dc68, 0xbead806a, 0x400b549b, 0x3fdff7cc, 0xbe5c19a0, 0x3fb9cbfe, 0x3fe9146d, 0xbfc1e454, 0xc059d063, 0xbfeb29be, 0xbfc34a69, 0xbfc493d4, 0xc017304d, 0xbfe165de, 0x406cb9b2, 0xc028f5b1, 0xc031dcae, 0x3fb4ba57, 0xc0dec7f2, 0x3f09e06b, 0x40bc7f8a, 0xbf484465, 0xc0303565, 0xbff0a347, 0xc02b105a, 0x403c922b, 0xc062dce9, 0xbfb616ce, 0xbfce3242, 0xc06b796f, 0x4016d594, 0xbfa8eaf2, 0x405a7508, 0xbe86ae10, 0xc097331c, 0xc02f275c, 0x3ebcad92, 0xc03fd13e, 0xc027230c, 0x4009ef1b, 0x40b47e22, 0x4080bc6c, 0x401a9245, 0x4015877a, 0x408788e4, 0x40124b6b, 0x401eea5c, 0xbfe0b852, 0xbfe11c5e, 0x3f6c0e12, 0xc0a6b402, 0x3f1e4ec0, 0x4093a7c1, 0xbf2553ca, 0xc0393442, 0xbf9a0098, 0xbfe48b42, 0x3fd4334e, 0xc01c911c, 0xbfa16a85, 0xbfdb6112, 0xc0339828, 0x3fc81b0b, 0xbf37796c, 0x402c6117, 0x3dbbd735, 0xc0817573, 0xbffda420, 0x3f21cd94, 0xc016c2f6, 0xc00601b9, 0x3fc7fe74, 0x408e6ebc, 0x40315344, 0x3ff1981f, 0x3fc65563, 0x4069b171, 0x40054bcc, 0x3f2ac1b3, 0xbf41a37d, 0xbe5c359e, 0xbc95a152, 0xbeacd720, 0x3d5d8a9d, 0x3f9f8342, 0x3beb21dc, 0xbeb4562a, 0xbebcf3be, 0xbe015615, 0x3f2081fb, 0xbe063045, 0xbeb8502f, 0xbf633a0e, 0xbf4b06ac, 0x3d33c075, 0x3f1e8f96, 0x3ea589cf, 0xbd9b5157, 0xbf7d0c83, 0xbd561989, 0xbed1f533, 0x3dad31f7, 0xbde8d860, 0xbf1189b5, 0x3ea9819d, 0xbe235c70, 0x3eeb05b3, 0x3e8fa6ef, 0x3f9995b3, 0x3efd87e7, 0x40cc115f, 0xc0981af2, 0xc0836cd9, 0x400450ba, 0xc12d2a7d, 0x3f5a302d, 0x4124e14f, 0xbfb60ce9, 0xc09457f6, 0xc0524dbb, 0xc0931cf9, 0x409ff188, 0xc0cbf754, 0xc038eca6, 0xc05e9eb0, 0xc0d38851, 0x406355d2, 0xbf5f292f, 0x40c6a425, 0xbf4f40b1, 0xc10bb66e, 0xc08875b2, 0x3ec1876d, 0xc070677c, 0xc07f5503, 0x40175128, 0x410f85e6, 0x40ba6a2e, 0x40a3f73b, 0x408ce871, 0x40eb378d, 0x406daea4, 0xc00766aa, 0x3f843af2, 0x3fc0e94d, 0xbeee3c83, 0x403ff2c5, 0x3f6d19a0, 0xc046c10f, 0xbeebd02f, 0x3d5e5f26, 0x3f7924e8, 0x3fe7b265, 0xc0064316, 0x402fa92a, 0x3f493a04, 0x3e76a594, 0x3fc9ff79, 0xbfa7be58, 0xbedd283a, 0xbfbc94df, 0x3f27a545, 0x3fa0168c, 0x3fa2df22, 0x3dfcb6eb, 0x3fc76e82, 0x3fe96fec, 0xbf9c9ef7, 0xbfecbcae, 0xbf9e353f, 0xbfcac99e, 0xbfb52c6d, 0xbf9cdb0d, 0xbfa75012, 0x40213b3e, 0xbfe802e5, 0xc00850e1, 0x3f751433, 0xc08ce79f, 0x3eb5c26a, 0x4077e961, 0xbf8bfbe5, 0xc015b1b7, 0xbf8d87f6, 0xbfd0601a, 0x3fff0669, 0xc0197db6, 0xbf8dc59c, 0xbf6a99b6, 0xc0329b0b, 0x3f97a2ce, 0xbf465320, 0x40320804, 0xbe3b5a13, 0xc059a970, 0xbfc61d97, 0x3efeae8f, 0xc00053f6, 0xbfa7b6f4, 0x3fb23d32, 0x4079ddcf, 0x401b7dfa, 0x400836ed, 0x3f8e726c, 0x40595634, 0x3faca51e, 0xc0702422, 0x400093ff, 0x4012571f, 0xbfb53221, 0x40aa70de, 0x3d3f66df, 0xc0ab6d59, 0x3ec61bbb, 0x40067536, 0x3f8c40b3, 0x3fd96bb0, 0xc02a9daf, 0x405bd028, 0x3f59ce1a, 0x3fbf1621, 0x405583de, 0xbf1474fa, 0x3e81b007, 0xc01e741e, 0x3f895a27, 0x4073ce9a, 0x3fd0df94, 0xbec16c5b, 0x402df3eb, 0x3fb725f6, 0xbfaeed6f, 0xc06fdb47, 0xbffcf0d8, 0xbff5fc13, 0xbfeeb9a3, 0xc095cb21, 0xbfe0fa98, 0xc10037c5, 0x40a4af85, 0x408480d4, 0xc0074749, 0x4133a88d, 0xbf22fb01, 0xc13ee9e7, 0x3fd1c5e8, 0x409a1516, 0x40367a00, 0x40a320aa, 0xc0c74c74, 0x40f82e20, 0x401932b8, 0x4087dc59, 0x40ee61f5, 0xc027d34a, 0x3ec34b6d, 0xc0d2fe1f, 0x4005f3c0, 0x411baeae, 0x4076f6c3, 0xbdeb2f87, 0x4093a2dd, 0x406b6b00, 0xbfe528c5, 0xc11c7548, 0xc0b69b52, 0xc0b49373, 0xc0887e32, 0xc117e05e, 0xc055904b, 0xbfff11ed, 0x3f8bed04, 0x3fd8c574, 0xbdf7edeb, 0x408815bc, 0x3e71128f, 0xc07e9313, 0x3e8ac4ea, 0x3fb050a4, 0x3f612a40, 0x3ff0a2bb, 0xc00f0d01, 0x4025db84, 0x3f61ed20, 0x3fc2fb1d, 0x3fe75be0, 0xbfb3b5e0, 0x3ebb7cf6, 0xbff501bf, 0x3ed4ea48, 0x4024a4a5, 0x3fc7bdb6, 0xbf0a9fb2, 0x3fcb85bd, 0x3ff1d7ae, 0xbfbe189f, 0xc04f4bb7, 0xc0088d93, 0xbfc9f610, 0xbfe6064a, 0xc00eee53, 0xbfb10144, 0x40ec23b1, 0xc0807546, 0xc078d177, 0x3ffe4593, 0xc1291ecb, 0x3d3d3176, 0x4131dfd5, 0xbf95cee3, 0xc0883eae, 0xbffb52e9, 0xc08c61f5, 0x40b3e7b9, 0xc0e81cd5, 0xbfc9cba6, 0xc06bd7b2, 0xc0d250ce, 0x401ace4f, 0xbf89e8de, 0x40bddc90, 0xc0013696, 0xc10cb327, 0xc065b890, 0x3ee9933c, 0xc09cfc4a, 0xc05030d0, 0x40082b13, 0x410aef6a, 0x40aeb776, 0x408b7cbe, 0x4067ce68, 0x410761c5, 0x403d6978, 0x3f16e9a4, 0xbf3cf3d0, 0xbef4345b, 0x3f4af8f7, 0xbff46247, 0x3e70b0c8, 0x3f881f23, 0x3e0bd3cf, 0xbee85dd2, 0xbf15b68d, 0xbf6e7337, 0x3ebcfd62, 0xbe514bd1, 0xbef70162, 0x3e31cc8a, 0xbf8f7b47, 0x3f4de57c, 0xbe6aed81, 0x3f621d7f, 0xbc8e3f60, 0xbf574c5c, 0xbf36e7e3, 0x3d4ec749, 0xbeedc717, 0xbf8c4c0b, 0x3f377a0a, 0x3f45b91c, 0x3f497ca1, 0x3f324131, 0x3f045831, 0x3f83381a, 0x3eea93e3, 0xc08252e0, 0x40246caa, 0x401529d5, 0xbfc25002, 0x40c8a462, 0xbe9aeddd, 0xc0cbdecc, 0x3f812769, 0x402224bd, 0x3fc68f1d, 0x403c3bad, 0xc04d5bc6, 0x4077bebb, 0x3f912a01, 0x3fef4fa3, 0x40751d35, 0xbfbe03d0, 0x3f63c297, 0xc069a5ac, 0x3f384f32, 0x40a173ad, 0x40270b85, 0xbf18423e, 0x402f5967, 0x401e79b5, 0xbfe346ee, 0xc0ad309d, 0xc03f3f6f, 0xc0298db4, 0xc0064c16, 0xc096a57f, 0xbff978f2, 0xc0984c46, 0x404f90e5, 0x402a126d, 0xbfb8d521, 0x40fe2d80, 0xbe9957c4, 0xc0f43ab2, 0x3f91796b, 0x40730843, 0x400273b5, 0x40474945, 0xc0654a98, 0x407f28c3, 0x3ff4d61a, 0x4010ed72, 0x409de097, 0xc00bf8ba, 0x3f35d5a6, 0xc08dea40, 0x3f252955, 0x40c2ba6e, 0x4058c8ca, 0xbec00da9, 0x403ddb56, 0x404d2c00, 0xc008be2e, 0xc0cb74d0, 0xc08554e9, 0xc055e972, 0xc02e6367, 0xc0c1c996, 0xc0208107, 0x3f9034f9, 0xbedbf3af, 0xbf82f6a8, 0x3ec9b6e6, 0xbfafea55, 0xbe44259e, 0x3fb8c1c3, 0xbec2624b, 0xbf5916d6, 0xbda6b6db, 0xbf112ac4, 0x3efac029, 0xbf86ff82, 0xbd219964, 0xbec4d8fa, 0xbf1b3e50, 0x3f09f46d, 0xbe3a43a7, 0x3ecca79e, 0xbd713373, 0xbf40f4e4, 0xbf8d3ccf, 0x3d4581bf, 0xbf5f869b, 0xbf0fb7eb, 0x3f980371, 0x3fbbb9b0, 0x3f02802e, 0x3f0f07cf, 0x3f2e874b, 0x3f8135d8, 0x3ed7d1c9, 0xc0e28807, 0x407a3ed2, 0x4062ba05, 0xbfd85a77, 0x4120bebe, 0x3ad6c987, 0xc11c346f, 0x3fa8c20a, 0x4065cfbe, 0x400d60cb, 0x408ae9a6, 0xc0b6540f, 0x40e069d9, 0x3fe1338e, 0x403c3cfa, 0x40cf7a79, 0xc00a54bd, 0x3f4bddd0, 0xc0a9a419, 0x3ff8a0ad, 0x40fd0ae0, 0x405255fa, 0xbf3aaad2, 0x40738415, 0x404acacf, 0xc01e4731, 0xc0f06a32, 0xc08d95e2, 0xc0835044, 0xc07633b7, 0xc102f85f, 0xc039bf76, 0xc0b41842, 0x4056d164, 0x4062fa36, 0xbfea88c2, 0x410ea8e9, 0x3dd51f03, 0xc108e903, 0x3f30b8f9, 0x4068367d, 0x3ff506f4, 0x40518f30, 0xc0961a0a, 0x40b1570e, 0x3ffa1b4e, 0x4027a08f, 0x40a36b2e, 0xc003ea20, 0x3f44993d, 0xc092429e, 0x3fac1563, 0x40d19181, 0x40475cfc, 0xbedab050, 0x408a3321, 0x406776bc, 0xc03d73ae, 0xc0e01714, 0xc089e497, 0xc0623075, 0xc053aea9, 0xc0d51b59, 0xc041659f, 0x3fc28712, 0xbf8d45b0, 0xbf2ee81c, 0x3e94a1b5, 0xc021cb75, 0xbe4c475a, 0x40340ec0, 0xbebbab0d, 0xbf9b31bb, 0xbeea929e, 0xbf91813b, 0x3f9d661b, 0xbfcbae27, 0xbed255fe, 0xbfae9bd2, 0xbf7bc27c, 0x3f026193, 0xbdf12449, 0x3f9d7163, 0xbedf504c, 0xbfed6bf0, 0xbf5db7b8, 0x3df5afdf, 0xbf981fd6, 0xbf8d9b97, 0x3f5dbc2a, 0x4000cbe7, 0x3fbcf6fd, 0x3f45b6df, 0x3f959525, 0x3fe2c84b, 0x3f9ab607, 0xbfaafcff, 0x3fdcf660, 0x3f818108, 0xbef1ecd7, 0x4063b20b, 0xbdb0f2a4, 0xc03f1344, 0x3ee7c2f2, 0x3fdb01d4, 0x3f6e1456, 0x3fb9a6bc, 0xbf9d50cb, 0x3fdc2ebb, 0x3f242f84, 0x3fa3b0dd, 0x3fdf42b0, 0xbfeacc2d, 0x3f2d03e8, 0xbff183f4, 0xbe84d1c3, 0x40379f41, 0x3fe2bd0e, 0xbe7f2790, 0x3fa353b8, 0x3fa00b4a, 0xbf87d39d, 0xc043ba0a, 0xc0075d02, 0xbfa8c3b2, 0xbfbbc1e9, 0xc004aa9f, 0xbf9cc5b4, 0xc0751e49, 0x401a47f4, 0x40335b45, 0xbfa56352, 0x40cd906f, 0xbebc9c3e, 0xc0c6e29a, 0x3f9feab3, 0x40659a32, 0x3fcca74c, 0x401b9d36, 0xc02858f7, 0x405d1333, 0x3fc63876, 0x401b8dda, 0x406d58eb, 0xc000840a, 0x3f9f9e01, 0xc070616b, 0x3f19eb99, 0x40a6380a, 0x401a52e0, 0xbf2323d3, 0x404b2b93, 0x400f2eef, 0xbfccd436, 0xc0c07448, 0xc081a756, 0xc03caa9f, 0xc00c4fdf, 0xc09d7b9a, 0xc00f8c58, 0xc11a3dff, 0x40c028e8, 0x40ba28fe, 0xc0358848, 0x41639de1, 0xbef0d3fb, 0xc16ac1b0, 0x3fcad89d, 0x40b91e1e, 0x40600710, 0x40c982b0, 0xc0e76443, 0x41129043, 0x404d930e, 0x4082e8e7, 0x410a278f, 0xc07fd6af, 0x3fb7f53c, 0xc0fdca99, 0x3fe24abe, 0x41330bdf, 0x40a95985, 0xbf158de5, 0x40cac51f, 0x40a45b28, 0xc05e8970, 0xc13c80d7, 0xc0e7deea, 0xc0c75b7a, 0xc0a5358a, 0xc129aeae, 0xc0898ed6, 0x40614f7f, 0xbfa26c26, 0xc00c639e, 0x3f81f8da, 0xc096e761, 0xbdf31029, 0x409668d6, 0x3dac2a6f, 0xbff9e54d, 0xbf92206e, 0xbffe3370, 0x402fec1e, 0xc05fb9f1, 0xbf7fa3c4, 0xbfd17958, 0xc04372c1, 0x3f4b97ed, 0x3cebcb9f, 0x401cee37, 0xbf7956bf, 0xc049a619, 0xbfb187d4, 0x3f16bb5a, 0xc0290908, 0xbfb0cbca, 0x3fa3c863, 0x405a1c7f, 0x3ffe2e03, 0x3ff31ee6, 0x3feb3fad, 0x406b9bc9, 0x3fc9a26d, 0xc1099447, 0x408a9335, 0x409cc051, 0xc00961d3, 0x41542883, 0x3f1c2b16, 0xc1500a6e, 0x3fb309f0, 0x40a70cce, 0x403dd2fe, 0x40ac45b5, 0xc0efec7f, 0x4114fa6d, 0x3ff7b499, 0x4074fd26, 0x40f91f98, 0xc01d73d9, 0x3fbc01ad, 0xc0e0d304, 0x400eae7d, 0x4120f9d6, 0x40937757, 0xbf82a477, 0x40bce61b, 0x40a7e720, 0xc08b3837, 0xc128877d, 0xc0cfb668, 0xc0a39844, 0xc0a1307e, 0xc12f488c, 0xc06d46ce, 0x40d47bc2, 0xc04e3d7b, 0xc046fd15, 0x3fb1c92c, 0xc1089d34, 0xbe889215, 0x4113cce6, 0xbf8046fc, 0xc0362c5e, 0xc005c6a8, 0xc0732b50, 0x40b59e78, 0xc0cd55db, 0xbfa59dd4, 0xc02f09d2, 0xc0a522b8, 0x3faa8e95, 0xbf1d60ec, 0x408d559b, 0xc018319f, 0xc0d9e9e7, 0xc00ffdee, 0x3e995dab, 0xc0672537, 0xc0303bff, 0x3fd29058, 0x40d5fb2e, 0x4071d59f, 0x406a69af, 0x406171ff, 0x40daba07, 0x40110fc0, 0x4016bfbb, 0xc00e99f3, 0xc014a0f4, 0x3fa68dbd, 0xc0bb8cee, 0xbd5d4fb0, 0x409b6a86, 0xbf6aacb4, 0xc037746d, 0xbfd6ce8e, 0xc003c592, 0x401c4056, 0xc03de728, 0xbfcc8ab8, 0xbfa01079, 0xc048fc1c, 0x401731db, 0xbf871cdb, 0x404823e0, 0x3f48b92a, 0xc07339fc, 0xc0458006, 0x3eb3db13, 0xc0182d63, 0xc047664c, 0x402a5b56, 0x409cb5d7, 0x404ae8f1, 0x40228498, 0x40004df3, 0x40820067, 0x400031f0, 0x40613551, 0xbff4658f, 0xc011c31b, 0x3f6a42ae, 0xc0bc0813, 0xbec2625c, 0x40b8fb67, 0xbf3d6d67, 0xc02b2931, 0xbf681242, 0xc010a5ff, 0x40458f81, 0xc071b753, 0xbf282bf2, 0xbfd41712, 0xc0590e9f, 0x3f9c0df1, 0xbf785cad, 0x403bcd87, 0xbf6041b0, 0xc08b4ec2, 0xc01f5256, 0x3f320be4, 0xc03ebf26, 0xc02c4a8c, 0x4018d24a, 0x4095d152, 0x40406019, 0x4013bf03, 0x401854f9, 0x409cc8db, 0x40010e72, 0x40423560, 0xbfe745a2, 0xbfdd4120, 0x3f4f017b, 0xc09d1d29, 0x3e0f9de3, 0x409b774e, 0xbf29817f, 0xbfe7d05f, 0xbf806fc5, 0xc004e2f8, 0x401df7bc, 0xc047c726, 0xbf93c3d5, 0xbf8e9d55, 0xc03ae0b7, 0x3fae9742, 0xbf3f5138, 0x403569f9, 0xbf3e7049, 0xc06ab7b4, 0xbfdb4e6e, 0x3d6b9156, 0xc0285c9c, 0xbff565ed, 0x3fc59a55, 0x40876fc7, 0x40247329, 0x4005106b, 0x3fd95205, 0x4075a38e, 0x3fa3200c, 0x3e44d5a5, 0xbfe4b285, 0x3f6c85f3, 0x4008763c, 0xbf60edd7, 0xbfdad66d, 0x3ebed1c6, 0xbefbd373, 0xbf27a13d, 0xbfdc14c0, 0xbf036317, 0x3df028d8, 0xbed6ccf8, 0x3fe04492, 0xbe9f1fa9, 0x3eb07298, 0xbfd98df7, 0xbf348284, 0x3fb555e7, 0x4022a62d, 0x3fbc31ef, 0x3fa02dc4, 0x3fdc49e0, 0x3e9d82cf, 0xbee976ee, 0x3f194dab, 0x3f5e1544, 0xbf9be769, 0x3fa13810, 0xbf5f2986, 0xbf0ab666, 0xbf0fa238, 0xbf6f2c6a, 0x3ef37192, 0xbf29d152, 0x3ec62adc, 0x3f9af4a4, 0xbf611cf4, 0xbf38b831, 0x3e859ee6, 0xbe5738f0, 0xbca29a99, 0xbf13fd85, 0x3dd3cb30, 0xbe4188d4, 0xbf23f18c, 0x3f73aa8e, 0xbe75a472, 0xbe029eaf, 0xbeb69561, 0xbf236a36, 0x3f4eb7f9, 0x3f91ac52, 0x3f312110, 0x3f6c3f64, 0x3f50d33d, 0xbea7fdfc, 0xbe8f0d87, 0x3e73cf0f, 0x3ec35ccd, 0xbefb7678, 0x3f7bf77f, 0xbef77545, 0xbec7aae0, 0xbf03ad79, 0xbf0bb6d0, 0x3eb01471, 0xbfdf5ee7, 0x3f1313fe, 0x403cbdea, 0xbf70e0f7, 0xbfa510f1, 0x3fb4b6b9, 0xbf7d0b0e, 0xbf7067df, 0xbfee1eba, 0x3da7a6c9, 0xbef3cb0e, 0xbf4f7217, 0x3fc6cd76, 0xbf2ab4bc, 0x3e690578, 0xc010c7b4, 0xbf1aa1d5, 0x3ff12e6c, 0x401a62fe, 0x3ffb164c, 0x4001609f, 0x3fc7dbbc, 0x3f214618, 0x3e15fc27, 0xbed835b2, 0x3f71ab1c, 0xbfb449a4, 0x3f8db06d, 0xbfae3c1d, 0xbeed5e36, 0xbf3780c6, 0xbf353dad, 0x3e1a72bf, 0x3ef3c215, 0xbee8db24, 0x3c853be1, 0x3ee0ece8, 0x3f545d72, 0x3d8fdae0, 0x3e720c1b, 0x3e0415f6, 0x3d016906, 0xbe383175, 0xbe8dbaa3, 0xbceb63c2, 0xbe71f83a, 0xbd7b2715, 0xbe080fac, 0x3c86201d, 0x3f2bb2b4, 0xbed6f7b6, 0xbf4b6d25, 0x3e819400, 0xbe471bfb, 0x3df703c1, 0xbe87314b, 0x3ea00760, 0xbf4f1bbe, 0x3c3a09a8, 0xbdf08b77, 0xbf3e7d20, 0x3ec304b4, 0x3e5fffa3, 0xbd92b4ee, 0x3ea6bc8e, 0xba19e738, 0xbec2c96a, 0x3ec3a738, 0xbd702d08, 0x3e99bd07, 0xbf2ce1e5, 0xbe4b5f4c, 0xbe2a19f4, 0xbee641c9, 0xbc193d46, 0xbe2f52c9, 0xbdfcc95a, 0x3eaaa610, 0x3f372fd0, 0x3f1a4d9d, 0xbbb16605, 0x3e64d55b, 0xbe5cd061, 0x3e9bf773, 0x3ec2d705, 0x3eb18b73, 0x3f619ccb, 0xbd428592, 0xbdc624cc, 0xbe76e6ba, 0x3d8b6e71, 0x3ec7f94f, 0xbd9662b5, 0x3e9475d4, 0xbf635a59, 0xbeef223a, 0xbed66ca0, 0xbd5e41ef, 0xbe7dd556, 0x3c2e3cac, 0x3e5838ff, 0xbf43d441, 0xbe308c35, 0xbf052628, 0xbe74b3f5, 0xbb8aabd6, 0xbdd0c21b, 0x3df7efba, 0x3ee61e0c, 0x3ecf843b, 0x3d8aecf7, 0xbe6d3a38, 0x3ef0079c, 0xbe9e8635, 0xbc484e14, 0xbf119603, 0x3d110d4d, 0x3ee50821, 0x3d23c1f1, 0xbd57bfc9, 0xbe9cadeb, 0xbc495a32, 0x3ea92f96, 0x3e08aedf, 0xbe1227c2, 0x3e6fa5a4, 0x3e00de3a, 0xbde4ae58, 0x3dd5720b, 0x3e3b962a, 0x3e3a9379, 0xbf44a548, 0x3ecf31fa, 0x3f01a2e0, 0xbf344e11, 0x3e3df7cf, 0xbdade5bf, 0xbe93da22, 0x3e446428, 0xbed61aab, 0x3e912d4a, 0x3cf125cb, 0x3e58838e, 0x3fbbc199, 0xbdb42eb7, 0x3efdcf8a, 0xbf2cda59, 0x3ea47869, 0xbe1caa30, 0x3cdc07c9, 0xbf665436, 0xbc60bebd, 0xbf0b1f7a, 0x3c9d2ac8, 0xbf0e782f, 0x3f496f6d, 0xbf06f531, 0x3e78ad9a, 0x3e04c037, 0xbeb4290e, 0xbeec2051, 0xbea6a422, 0x3ec5b028, 0x3f3545e2, 0xbf136562, 0x3fab87a4, 0x3e202705, 0xc0040352, 0x3f6eb39e, 0x3ef79646, 0xbfac1b48, 0x3f167a4c, 0x3f112b15, 0x3fbcef12, 0x3e90d425, 0x3f5904fc, 0x3fc7c64e, 0xbfdd47e7, 0x3eb9f4a4, 0xbf11693f, 0x3fca4fa4, 0x3e9c6549, 0xbfadcc41, 0xc009ce2f, 0xbfb1ef48, 0xbfc7ef0c, 0xbf50592f, 0xbf1065d2, 0x3bd41fbd, 0x3d29eeed, 0xbf2a13ba, 0x3f68fd4d, 0xbf754db7, 0x3f7afeea, 0x3d97d715, 0x3f67a949, 0x3f39f05c, 0x3f030b58, 0x3dafa8d3, 0xbf34a234, 0xbee43d19, 0x397ce804, 0x3f1b3844, 0x3e87cbd3, 0x3db97509, 0x3f05a603, 0x3e28a488, 0xbe85018f, 0xbef03c80, 0xbf154a85, 0xbea36e8f, 0xbee74bce, 0x3e3cc6f5, 0x3e39bc70, 0x3ed6d387, 0xbe65735f, 0xbe85916b, 0x3d86e3e2, 0x3e2eda56, 0xbf2244fc, 0x3bf4eeff, 0x3eb44ae6, 0xbe60cba2, 0xbec43424, 0x3cbe7002, 0x3e34ad39, 0x3ecb26d9, 0x3f0df543, 0xbc248f7c, 0x3e1efc7c, 0xbe03ccc4, 0xbf444d35, 0xbde991b7, 0x3fbc581e, 0xbf34bc4a, 0xbe446c77, 0x3f4bf19a, 0xbf07d38a, 0xbf1ecb39, 0xbf67b4b3, 0xbd925fde, 0xbe677919, 0xbfa21a63, 0x3f8bc288, 0x3d423b2a, 0x3ec4c40b, 0xbf447a86, 0x3d5beff2, 0x3f8915c5, 0x3f9d7d79, 0x3f576fcf, 0x3f4c81f3, 0x3f0f90da, 0x3f0741ae, 0xbc6cb7a2, 0xbed2ff9e, 0x3ecb57ec, 0xbf164103, 0x3ef9588d, 0xbe9f2dca, 0x3e635242, 0xbee45629, 0xbf43fb08, 0x3d000426, 0x3ec32aa9, 0xbf2d833f, 0xbf88b6ea, 0xbb83a0eb, 0x3f1b2cc2, 0xbf14ce96, 0x3c8ce0c2, 0x3ecf27a2, 0x3f4338ec, 0x3f22d5f9, 0x3ed9e576, 0xbeb3068e, 0xbee3f2df, 0x3f1b67c6, 0x3e8333a5, 0x3f4f5203, 0x3e2b55b3, 0xbf054e4e, 0xbeb09fb2, 0xbf28968e, 0xbee63ba8, 0xbfa4415a, 0xbe7366fc, 0x3e13c171, 0x3e99e482, 0xbee178ec, 0x3ec9c3c5, 0xbed1c3f5, 0x3f2041de, 0x3ea8dd71, 0x3c4c90c2, 0xbe0f4c7a, 0x3f2c5734, 0xbf928175, 0x3f0910ae, 0x3fdca31e, 0xbe41f7a4, 0xbeff2af2, 0x3f0b1284, 0x3e42d386, 0xbe74913f, 0xbf88999a, 0xbf6658cc, 0xbd560a69, 0xbedcca13, 0x3f23e78b, 0xbf0627f7, 0x3ec582c2, 0xbf998782, 0xbe3c77e9, 0x3ef2c075, 0x3f945000, 0x3f251033, 0x3f90d3fa, 0x3f9541af, 0x3ea7c760, 0xbf3ba452, 0x3f104ac3, 0x3ef623bb, 0xbf65977e, 0x3d88222e, 0xbe24cd44, 0xbe81c8a9, 0xbe63d885, 0xbf5d3af6, 0xbeb89e1f, 0x3e80f08b, 0xbe136d74, 0xbf54efb7, 0x3f83ba74, 0x3c907d09, 0xbf9ab265, 0x3e6654fb, 0x3d11b13c, 0x3f28ca3a, 0xbe604fd3, 0x3f27411b, 0x3f050490, 0xbee76151, 0x3e95eb65, 0xbec2c8e6, 0x3ecd5096, 0x3e883373, 0xbed59aff, 0xbed3c463, 0xbf0b1d5a, 0xbf29fb24, 0xbf16e16b, 0x3ec4527b, 0xbde108d4, 0x3e8b7ca7, 0xbe335986, 0x3f15bf8c, 0xbf419043, 0x3eb93b26, 0x3e1ed012, 0x3d8a0648, 0x3ecc266f, 0x3ec5651c, 0xbf3b2fe8, 0x3f094e08, 0x3fbae91f, 0x3e86cc66, 0xbf606f76, 0x3edc4832, 0xbedaa456, 0xbeab0b94, 0xbf5b2237, 0xbf0d6d54, 0xbef118c5, 0xbde3392d, 0x3f9ac3bb, 0xbec6c7b1, 0x3e8c3ebd, 0xbf364a5e, 0xbe9e3e35, 0x3f5adc13, 0x3f82f086, 0x3f05c451, 0x3f260525, 0x3f7d3280, 0x3ecea0a8, 0xbf5884b2, 0x3dc1a451, 0x3e7155fa, 0xbf083deb, 0x3e43c3b8, 0x3b5fc938, 0xbeaf5bd4, 0xbee6c613, 0xbef76516, 0x3d3e72c1, 0x3f67d2c4, 0xbea7af9d, 0xbf8652d6, 0x3c4a214e, 0x3f662a7e, 0xbead11af, 0x3e98c414, 0x3f4be0e2, 0x3f2a5afe, 0x3d5c54d2, 0x3ecbed8b, 0x3e9afa82, 0xbf6713cc, 0xbd7800db, 0xbe06fa9d, 0x3f69765a, 0x3edd29bf, 0xbfa4768f, 0xbfba2838, 0xbfb31938, 0xbf62f1d3, 0xbf3426a6, 0xbcfa14bc, 0xbe92e80a, 0x3f20e096, 0xbf102b19, 0x3f7516cc, 0xbeb9ba91, 0x3f258b2c, 0x3db249df, 0x3f043e92, 0x3e905300, 0xbe86fd5d, 0x3faabc02, 0xbe45bac5, 0xbfe3bdf8, 0xbcad619b, 0x3f56e8a4, 0xbe97a8f3, 0x3eeddb56, 0x3f58a27b, 0x3f69009b, 0x3f463fdc, 0xbdc8ca05, 0x3e86a17f, 0xbfad1781, 0x3e02f978, 0xbea4a82a, 0x3f0c8dc7, 0x3ee1e6b9, 0xbf6c557e, 0xbfe68a92, 0xbf3d13ae, 0xbf7ccd22, 0xbf7d5bf3, 0xbea47176, 0x3f78b847, 0xbeb2f586, 0xbeee0a67, 0x3f069a7a, 0xbe78a5b5, 0x3dc638ea, 0x3edda483, 0x3f690e0c, 0x3f10387d, 0xbf370028, 0x3f3eeded, 0x3dd6dd11, 0xbf8af0ff, 0x3f333a5f, 0x3dcde6f4, 0xbfb86f9f, 0x3eb37200, 0xbd917ccb, 0x3eeab452, 0xbcad0689, 0x3ed0d0d8, 0x3f677ba2, 0xbf128cb5, 0x3efc56ea, 0xbf655dbc, 0x3f43d47f, 0xbc9a978a, 0xbed9ffb8, 0xbeee9285, 0xbcfd8aa7, 0xbf9ee9a2, 0xbf03ab8b, 0xbb85618c, 0x3f0271af, 0x3d3694ee, 0xbec65be2, 0x3dd0cd97, 0xbf6095c4, 0x3f59d758, 0x3e73fc1a, 0x3eb90bff, 0x3f3c7451, 0x3e838a9b, 0xbf5e7625, 0x3c9a7f5f, 0x3fbe27eb, 0xbf19cb69, 0xbeaf0f20, 0x3f40c894, 0xbd922982, 0xbe3e9a1e, 0xbf711882, 0xbeed7637, 0xbee73520, 0xbf0fbea2, 0x3f4cd10f, 0xbd7760d4, 0x3e2c94a6, 0xbfa4d7dd, 0xbe66a1ba, 0x3f70bc48, 0x3f451034, 0x3fa3efd5, 0x3f358443, 0x3f6e69d1, 0x3f38a6f2, 0xbe8e6b1a, 0x3e20e9b2, 0x3e9f683a, 0xbf68543a, 0x3e86975b, 0xbed2842e, 0xbe708b85, 0xbef45342, 0xbe26e36f, 0xbf2b89b1, 0x3ed6eb10, 0xbd972b1c, 0xbeb26260, 0x3edaa0c5, 0x3f207ac8, 0xbcb74089, 0x3f3ece6a, 0x3e336b95, 0xbe02b354, 0xbf3bbe8e, 0xbd84d986, 0x3f077eed, 0xbe253dda, 0xbe0be9b7, 0x3e1e44ba, 0x3e933117, 0x3e5e98dd, 0xbf086170, 0xbf8f239f, 0xbe3be7ee, 0xbf5e5b1e, 0xbe8af492, 0x3e28085b, 0xbe10d4e7, 0xbd0a4452, 0x3e134458, 0x3e1322b1, 0xbee3a2f0, 0x3ec5bd9b, 0xb98c568e, 0x3f24f32e, 0x3f046c9d, 0xbd486c46, 0xbd33c243, 0x3e5d557c, 0xbd1bf4e0, 0x3ec39865, 0xbf31fd10, 0xbe2fde95, 0xbdb9b8ef, 0xbedd60e1, 0x3e6fd0b0, 0x3e344803, 0x3d60c320, 0x3f1ed9d5, 0x3f239f1c, 0x3f04d02a, 0xbe16dd7d, 0x3f13d416, 0xbf1d355c, 0xbceca7f8, 0x3e74bada, 0xbe7b9b7a, 0x3e6bc1a5, 0x3e6c531b, 0xbe98033c, 0xbeb0700b, 0x3e465f29, 0x3e2a2f15, 0xbd4ca527, 0x3e91f62a, 0xbe971f2d, 0xbe92b60e, 0xbf18e65c, 0xbe2a4a67, 0xbe3723de, 0x3ea8b2e7, 0xbd268a8a, 0xbeaed558, 0x3f38bd86, 0x3e937d7c, 0x3c85fbb2, 0x3e8620e5, 0x3ebfa36b, 0x3e90652a, 0xbeb2f416, 0xbe13eae4, 0x3eb0da6f, 0xbec30268, 0xbde75587, 0xbd904805, 0x3e8e4bbe, 0x3df03047, 0xbebc0ac6, 0xbf11f7fe, 0xbe886d81, 0xbe939cd2, 0xbf054d0f, 0x3c0f6123, 0x3e0d4fe6, 0xbe10698f, 0xbead72f8, 0x3e62bd35, 0x3d66e92f, 0x3e9caf56, 0xbe481ab7, 0x3e0627fc, 0x3e604a5c, 0x3e9c3b0b, 0xbe8e5d33, 0x3ddf431a, 0x3e4c05ca, 0xbe25d372, 0xbf9315bd, 0x3d588262, 0xbe4df037, 0xbe737752, 0xbc64e1da, 0x3e922a15, 0xbe9f6ea9, 0x3eb4205b, 0x3ef9eec2, 0x3ef9659a, 0xbde2ade3, 0x3e29cde4, 0xbf026789, 0x3e8284c7, 0x3f115eed, 0x3da7721e, 0x3f08607d, 0x3e07d51e, 0xbf0fc19e, 0xbe42301d, 0x3ee4b23c, 0x3ed18c7b, 0x3d6c41ab, 0x3f20d553, 0xbf02203f, 0xbec23649, 0xbe9031f9, 0xbeacef69, 0x3c5911a6, 0x3d562809, 0xbe7fdc02, 0xbdbea8e6, 0x3e55b386, 0x3eafaae3, 0x3f0a0551, 0xbefb565d, 0xbef1ce5d, 0x3e4fcdd3, 0x3ce653c2, 0x3d858e4b, 0xbf2a2e68, 0xbe25848a, 0xbd36c4ac, 0x3ebffd49, 0xbd3cec87, 0x3ec4f5a6, 0x3e9a787d, 0xbc7a53a8, 0xbd2057d6, 0x3ead85b2, 0xbe9ced59, 0xbd5d75ec, 0x3e369adf, 0xbec1d979, 0xbca9ab04, 0x3d1bd8a1, 0x3d89fb68, 0xbf03cc64, 0x3eddc6ed, 0xbc597337, 0x3e8b42c1, 0x3d81bf12, 0x3e9e30bf, 0x3e322d7b, 0xbf0bed80, 0x3e10b242, 0xbe98ecb8, 0xbe5ceb18, 0x3eb90907, 0x3eadd2a1, 0x3e4df7c4, 0x3eadac74, 0xbd07d0a3, 0x3f889260, 0xbe42231b, 0x3efaa007, 0x3dc26e21, 0x3f84d05b, 0xbeacbc3d, 0xbe76359b, 0xbf075a5d, 0xbf843b11, 0xbe34a32a, 0xbdd1f6ab, 0xbf78ea70, 0xbe54ad78, 0x3ecd4cd9, 0x3dd3b4f7, 0x3ea76b8a, 0x3d6a317b, 0xbe9cc5c8, 0xbf07ee1e, 0xbe3dd854, 0x3d0f4fe0, 0x3dea49a3, 0xbef590cd, 0xbebc5140, 0x3eff44ec, 0xbf82adfc, 0x3f0ad3bb, 0x3f5664dd, 0xbecb9a62, 0x3e91d548, 0xbed34dd4, 0x3f149981, 0xbe233fd5, 0xbf95b4ce, 0xbda6a4d0, 0xbedd4639, 0x3e037ead, 0xbee1fc3b, 0x3daf5aea, 0x3ed8560d, 0x3f3fe612, 0x3f170601, 0x3e8832e8, 0xbe0c83fa, 0x3e9082f9, 0x3e79ec4c, 0x3d8a2880, 0xbe144d5b, 0xbe579006, 0x3ebc13c9, 0xbe471d41, 0x3f17703a, 0xbd5e73bd, 0xbefbdcc0, 0x3fa7f294, 0xbecbcac5, 0xbf4af690, 0x3fc61c5a, 0xbf051c07, 0x3f0b8cf2, 0x3fbf7683, 0x3d6fa83d, 0xbeaed6f0, 0xbf6326f0, 0xbe749754, 0xbf3bbc6f, 0xc00137fe, 0x3f0476a2, 0xbfa53d4f, 0x3f8d16fb, 0xbfc65043, 0x3f6b3d48, 0x3f248dbc, 0x3f3c1451, 0x3f781209, 0x3fbb169e, 0x3eec68bc, 0x3f1ad7bc, 0x3e3927a5, 0xbf188446, 0xbe96a5c2, 0xbf163aef, 0x3eefc146, 0xbf3bee00, 0xbddac18f, 0xbe429f4b, 0xbee3f769, 0xbe88020d, 0x3f3b2e74, 0xbe9b7f6e, 0xbfc3c609, 0x3e056210, 0x3f5dc984, 0xbf7ecc38, 0x3dd36a28, 0x3eae898a, 0x3f2525f3, 0x3ee0e3be, 0x3f342a65, 0x3e08dcdb, 0xbfbf28df, 0xbca46a16, 0xbea1fd44, 0x3f38466f, 0xbc2e1a33, 0xbf58cacb, 0xbf33b8f4, 0xbf42c9a4, 0xbfaaff23, 0xbf4a8523, 0x3ec920e5, 0x3e9e62a2, 0x3ed77157, 0xbf0ddcdb, 0x3f83fce0, 0xbf32e05b, 0x3fa1e50f, 0x3f07fdf3, 0x3e9e62d6, 0x3e457805, 0xbeb0bc8c, 0xbd3e9069, 0x3e1d179d, 0xbe501216, 0x3d959217, 0xbda5b9a4, 0xbda6f215, 0xbd1cbb29, 0xbd8bda92, 0xbdf166d4, 0x3dcfa9d6, 0x3d0724fc, 0x3ec696ec, 0x3e016de7, 0xbe978c58, 0x3dc904ae, 0xbee41b8e, 0xbdcac093, 0x3e9b866e, 0x3f2ad545, 0xbdaf5c06, 0xbe16935f, 0xbcf0a3f4, 0x3e637a18, 0xbe15f401, 0xbdab59b9, 0x3de90aba, 0xbe1937a2, 0xbd4247f7, 0x3e886e85, 0xbd98aa59, 0xbe103de7, 0x3ded1eae, 0xbe925150, 0x3f6c69b8, 0x3e5aedf3, 0xbf832ea5, 0xbe72bf12, 0x3e333f69, 0x3e0090cc, 0x3ddea58b, 0x3f1c40ba, 0x3f527f4c, 0x3edbd40e, 0x3df6ac75, 0x3e4b4458, 0xbf30f528, 0x3d1ca7e7, 0x3e4ae6b1, 0x3ee83df6, 0x3e8377e0, 0xbf48cbac, 0xbf94601f, 0xbf2e3381, 0xbf516bc8, 0xbf2199ba, 0xbde3d46e, 0x3e1ea51d, 0xbdddad4f, 0xbe79fdc3, 0x3ebea577, 0xbe350e2a, 0xbd785be3, 0x3eb4f738, 0x3ec59a6a, 0x3eeac455, 0x3f72e4cb, 0xbf17cf89, 0xbeb286bb, 0x3f3c143b, 0xbf3046d7, 0x3e815981, 0x3ec27d05, 0xbe9d05b2, 0x3b845c2b, 0xbe050980, 0x3eeb925f, 0xbe4ed80e, 0xbf88e9e5, 0xbd027cf6, 0xbe7d7a0d, 0x3ec35b17, 0xbf093056, 0x3d54b976, 0x3e1787a5, 0x3f3ea281, 0x3e03feac, 0x3f32a8b9, 0x3d651d79, 0x3e27cd4f, 0xbe0d1367, 0xbe3002b8, 0xbe1f88ff, 0x3df58795, 0x3f0c58c3, 0xbd807db1, 0x3e57be9f, 0xbea0c621, 0xbf14fb58, 0xbdf4d3f4, 0xbd2c9dfd, 0x3e8adc4f, 0x3edb2316, 0xbe86fa6b, 0xbed01e12, 0xbe23ca91, 0x3ce1ea94, 0x3dffe122, 0xbec7bc11, 0xbe45dfe5, 0x3dbd7a54, 0x3f457c30, 0x3f063544, 0x3e40a752, 0xbeeef9f1, 0x3e801f88, 0xbf1341ef, 0x3e4e3510, 0x3e5e6279, 0xbcd5ace6, 0xbeeaafef, 0x3f3d676c, 0xbe77415d, 0xbe89381a, 0x3df9b693, 0x3ed870c4, 0xbe383d73, 0x3ed5f243, 0xbcfe0ed8, 0xbf433c43, 0x3e3e8fdb, 0xbe28d19a, 0xbdef03db, 0x3f0e6b0b, 0xbef64b4f, 0xbf662ace, 0x3f586bf3, 0x3f89833a, 0xbdac28d2, 0x3e450812, 0xbe6cd861, 0x3f86eb62, 0xbeb0648a, 0xbdd00700, 0xbee50638, 0xbf56cd21, 0xbe6a177b, 0x3e3bb87e, 0x3f2ee90e, 0x3f896b6c, 0xbf5f7612, 0xbfab3731, 0xbf4937ba, 0xbf39ec71, 0xbeeabd45, 0x3eaa9869, 0x3e09d7df, 0xbec1e99b, 0xbf07a28b, 0x3f3c7c39, 0xbf6cf188, 0x3f4ea09f, 0x3ea54dd8, 0x3efca3c0, 0x3f359f54, 0xbec99ca8, 0xbeff465d, 0x3c87de52, 0x3f5333f0, 0xbe28f50b, 0xbed99533, 0x3db51807, 0xbf3e6d45, 0xbeb6cbbe, 0xbe3a9db3, 0xbd201d05, 0xbe0098d3, 0x3dbe6d46, 0x3f2f1dd5, 0x3e23d59d, 0xbd4e271d, 0xbec668e3, 0xbf00238f, 0x3f2e711d, 0x3f88c208, 0x3f112713, 0x3f350be3, 0x3f166cdd, 0xbe7c986e, 0xbd3da65b, 0xbe35be22, 0x3ed97e2e, 0xbebe3724, 0x3d3cddf4, 0xbed3f80f, 0x3ea6160d, 0xbed7ae71, 0xbe17fa4a, 0xbed55555, 0x3e800000, 0x3eaaaaab, 0x0 }; static const uint32_t ref_vec_mult[224] = { 0xb9eb511f, 0x3decd7a6, 0x3d9b04a7, 0x3d8f0546, 0x3d9b04a7, 0x3d61689d, 0x3eb16581, 0xb9eb511f, 0xbc11aeaf, 0x3decd7a6, 0x3d57d8f6, 0x3d9b04a7, 0xbd80ec6f, 0x3d8f0546, 0xbdad4052, 0x3d9b04a7, 0xbd80ec6f, 0x3d61689d, 0x3e7f7591, 0x3eb16581, 0xbde007cb, 0xb9eb511f, 0xbc11aeaf, 0xbc37d0c5, 0x3decd7a6, 0x3d57d8f6, 0xbd547a67, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0x3d8f0546, 0xbdad4052, 0x3e855333, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0x3d61689d, 0x3e7f7591, 0x3e2d93bf, 0x3eb16581, 0xbde007cb, 0x3eab4272, 0xb9eb511f, 0xbc11aeaf, 0xbc37d0c5, 0xbba06981, 0x3decd7a6, 0x3d57d8f6, 0xbd547a67, 0x3d9df5e0, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0xbe0fab8a, 0x3d8f0546, 0xbdad4052, 0x3e855333, 0x3daa9ca6, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0xbe0fab8a, 0x3d61689d, 0x3e7f7591, 0x3e2d93bf, 0x3e7a157b, 0x3eb16581, 0xbde007cb, 0x3eab4272, 0x3dbb355a, 0xb9eb511f, 0xbc11aeaf, 0xbc37d0c5, 0x3decd7a6, 0x3d57d8f6, 0xbd547a67, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0x3d8f0546, 0xbdad4052, 0x3e855333, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0x3d61689d, 0x3e7f7591, 0x3e2d93bf, 0x3eb16581, 0xbde007cb, 0x3eab4272, 0xb9eb511f, 0xbc11aeaf, 0xbc37d0c5, 0xbba06981, 0x3bb9143a, 0x3b905daa, 0xbbe61c97, 0xbbd33266, 0x3decd7a6, 0x3d57d8f6, 0xbd547a67, 0x3d9df5e0, 0x3e7ce3d9, 0x3dfd5083, 0x3e236b1e, 0x3de7529d, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0xbe0fab8a, 0x3dc33395, 0xbad3ede2, 0xbe479dd0, 0xbd8dc9bb, 0x3d8f0546, 0xbdad4052, 0x3e855333, 0x3daa9ca6, 0x3dfc6558, 0xbd1d8021, 0x3d01ef9d, 0x3e241dcc, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0xbe0fab8a, 0x3dc33395, 0xbad3ede2, 0xbe479dd0, 0xbd8dc9bb, 0x3d61689d, 0x3e7f7591, 0x3e2d93bf, 0x3e7a157b, 0xbe99ad7d, 0x3df89753, 0x3e8e6f09, 0x3ddc4be5, 0x3eb16581, 0xbde007cb, 0x3eab4272, 0x3dbb355a, 0x3e97fd3a, 0x3e443dbd, 0x3d896163, 0xbe0ad623, 0xb9eb511f, 0xbc11aeaf, 0xbc37d0c5, 0xbba06981, 0x3bb9143a, 0x3b905daa, 0xbbe61c97, 0xbbd33266, 0xbc4b3e50, 0xbca2bc35, 0x3bde3d3d, 0x3decd7a6, 0x3d57d8f6, 0xbd547a67, 0x3d9df5e0, 0x3e7ce3d9, 0x3dfd5083, 0x3e236b1e, 0x3de7529d, 0x3e0ba47f, 0xbe873660, 0xbd669919, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0xbe0fab8a, 0x3dc33395, 0xbad3ede2, 0xbe479dd0, 0xbd8dc9bb, 0x3d069b79, 0xbdd10b7b, 0x3e7e453a, 0x3d8f0546, 0xbdad4052, 0x3e855333, 0x3daa9ca6, 0x3dfc6558, 0xbd1d8021, 0x3d01ef9d, 0x3e241dcc, 0xbe9b0350, 0xbd303d02, 0x3e072b91, 0x3d9b04a7, 0xbd80ec6f, 0x3d06f9e3, 0xbe0fab8a, 0x3dc33395, 0xbad3ede2, 0xbe479dd0, 0xbd8dc9bb, 0x3d069b79, 0xbdd10b7b, 0x3e7e453a, 0x3d61689d, 0x3e7f7591, 0x3e2d93bf, 0x3e7a157b, 0xbe99ad7d, 0x3df89753, 0x3e8e6f09, 0x3ddc4be5, 0x3d428857, 0x3d135162, 0x3caae7a7, 0x3eb16581, 0xbde007cb, 0x3eab4272, 0x3dbb355a, 0x3e97fd3a, 0x3e443dbd, 0x3d896163, 0xbe0ad623, 0xbe302b9d, 0xbdaa9479, 0xbedd17aa }; static const uint32_t ref_cmplx_trans[2048] = { 0x3e91e21a, 0xbdaba414, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0xbe757ec5, 0xbd8889d2, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0xbe757ec5, 0xbd8889d2, 0xbe254915, 0xbd8083f0, 0xbe61cce5, 0xbe80fd7b, 0xbd4e5ab6, 0x3ea91014, 0xbcef5f67, 0x3d8bf790, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0xbe757ec5, 0xbd8889d2, 0xbe254915, 0xbd8083f0, 0xbe61cce5, 0xbe80fd7b, 0xbd4e5ab6, 0x3ea91014, 0xbcef5f67, 0x3d8bf790, 0x3ce6f5ee, 0x3e76c42f, 0xbc2ae685, 0x3f024b58, 0xbb7b7d03, 0x3ae4384b, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0x3e91e21a, 0xbdaba414, 0xbd744b77, 0x3d370e27, 0xbc3262f9, 0x3e2f8772, 0xbe757ec5, 0xbd8889d2, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3e91e21a, 0xbdaba414, 0xbe254915, 0xbd8083f0, 0xbc3262f9, 0x3e2f8772, 0xbe61cce5, 0xbe80fd7b, 0xbd744b77, 0x3d370e27, 0xbd4e5ab6, 0x3ea91014, 0xbe757ec5, 0xbd8889d2, 0xbcef5f67, 0x3d8bf790, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3e91e21a, 0xbdaba414, 0x3ce6f5ee, 0x3e76c42f, 0xbc3262f9, 0x3e2f8772, 0xbc2ae685, 0x3f024b58, 0xbd744b77, 0x3d370e27, 0xbb7b7d03, 0x3ae4384b, 0xbe757ec5, 0xbd8889d2, 0x3e582f70, 0x3ecf2571, 0xbe254915, 0xbd8083f0, 0x3e19d32e, 0xbd7b1579, 0xbe61cce5, 0xbe80fd7b, 0xbeb46138, 0x3dd62d85, 0xbd4e5ab6, 0x3ea91014, 0xbe43e530, 0xbf0191bf, 0xbcef5f67, 0x3d8bf790, 0xbb337648, 0x3cfb47db, 0x3e91e21a, 0xbdaba414, 0x3e582f70, 0x3ecf2571, 0xbc3262f9, 0x3e2f8772, 0x3e19d32e, 0xbd7b1579, 0xbd744b77, 0x3d370e27, 0xbeb46138, 0x3dd62d85, 0xbe757ec5, 0xbd8889d2, 0xbe43e530, 0xbf0191bf, 0xbe254915, 0xbd8083f0, 0xbb337648, 0x3cfb47db, 0xbe61cce5, 0xbe80fd7b, 0x3e518952, 0xbe492381, 0xbd4e5ab6, 0x3ea91014, 0x3e8d3fd8, 0xbd4d837c, 0xbcef5f67, 0x3d8bf790, 0xbe1b422c, 0x3f0758f6, 0x3ce6f5ee, 0x3e76c42f, 0xbc622877, 0xbefa4b3d, 0xbc2ae685, 0x3f024b58, 0x3ecd3960, 0x3dc4be81, 0xbb7b7d03, 0x3ae4384b, 0x3dcdf5db, 0xbd74a9ff, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0x3e91e21a, 0xbdaba414, 0xbd744b77, 0x3d370e27, 0xbe254915, 0xbd8083f0, 0xbc3262f9, 0x3e2f8772, 0xbe757ec5, 0xbd8889d2, 0xbe61cce5, 0xbe80fd7b, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e91e21a, 0xbdaba414, 0xbe254915, 0xbd8083f0, 0x3ce6f5ee, 0x3e76c42f, 0xbc3262f9, 0x3e2f8772, 0xbe61cce5, 0xbe80fd7b, 0xbc2ae685, 0x3f024b58, 0xbd744b77, 0x3d370e27, 0xbd4e5ab6, 0x3ea91014, 0xbb7b7d03, 0x3ae4384b, 0xbe757ec5, 0xbd8889d2, 0xbcef5f67, 0x3d8bf790, 0x3e582f70, 0x3ecf2571, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e91e21a, 0xbdaba414, 0x3ce6f5ee, 0x3e76c42f, 0x3e518952, 0xbe492381, 0xbc3262f9, 0x3e2f8772, 0xbc2ae685, 0x3f024b58, 0x3e8d3fd8, 0xbd4d837c, 0xbd744b77, 0x3d370e27, 0xbb7b7d03, 0x3ae4384b, 0xbe1b422c, 0x3f0758f6, 0xbe757ec5, 0xbd8889d2, 0x3e582f70, 0x3ecf2571, 0xbc622877, 0xbefa4b3d, 0xbe254915, 0xbd8083f0, 0x3e19d32e, 0xbd7b1579, 0x3ecd3960, 0x3dc4be81, 0xbe61cce5, 0xbe80fd7b, 0xbeb46138, 0x3dd62d85, 0x3dcdf5db, 0xbd74a9ff, 0xbd4e5ab6, 0x3ea91014, 0xbe43e530, 0xbf0191bf, 0x3efa8c8d, 0xbe6393a5, 0xbcef5f67, 0x3d8bf790, 0xbb337648, 0x3cfb47db, 0xbefe9ed2, 0x3e7376fb, 0x3e91e21a, 0xbdaba414, 0x3e582f70, 0x3ecf2571, 0x3efa8c8d, 0xbe6393a5, 0xbc3262f9, 0x3e2f8772, 0x3e19d32e, 0xbd7b1579, 0xbefe9ed2, 0x3e7376fb, 0xbd744b77, 0x3d370e27, 0xbeb46138, 0x3dd62d85, 0x3ea3943c, 0x3e399295, 0xbe757ec5, 0xbd8889d2, 0xbe43e530, 0xbf0191bf, 0x3dcc68c2, 0x3e0a900f, 0xbe254915, 0xbd8083f0, 0xbb337648, 0x3cfb47db, 0xbe28a269, 0x3d0da36d, 0xbe61cce5, 0xbe80fd7b, 0x3e518952, 0xbe492381, 0xbe83c471, 0xbe780ec4, 0xbd4e5ab6, 0x3ea91014, 0x3e8d3fd8, 0xbd4d837c, 0xbe5048db, 0xbd41adc5, 0xbcef5f67, 0x3d8bf790, 0xbe1b422c, 0x3f0758f6, 0xbec16846, 0x3ee87fb9, 0x3ce6f5ee, 0x3e76c42f, 0xbc622877, 0xbefa4b3d, 0x3c288ea8, 0xbe5a4e46, 0xbc2ae685, 0x3f024b58, 0x3ecd3960, 0x3dc4be81, 0x3ecbe074, 0x3c4265c2, 0xbb7b7d03, 0x3ae4384b, 0x3dcdf5db, 0xbd74a9ff, 0x3e2102a8, 0xbd90b1f0, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0xbe757ec5, 0xbd8889d2, 0x3e91e21a, 0xbdaba414, 0xbd744b77, 0x3d370e27, 0xbe254915, 0xbd8083f0, 0xbd4e5ab6, 0x3ea91014, 0xbc3262f9, 0x3e2f8772, 0xbe757ec5, 0xbd8889d2, 0xbe61cce5, 0xbe80fd7b, 0xbcef5f67, 0x3d8bf790, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc2ae685, 0x3f024b58, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbb7b7d03, 0x3ae4384b, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e582f70, 0x3ecf2571, 0x3e91e21a, 0xbdaba414, 0xbe254915, 0xbd8083f0, 0x3ce6f5ee, 0x3e76c42f, 0x3e19d32e, 0xbd7b1579, 0xbc3262f9, 0x3e2f8772, 0xbe61cce5, 0xbe80fd7b, 0xbc2ae685, 0x3f024b58, 0xbeb46138, 0x3dd62d85, 0xbd744b77, 0x3d370e27, 0xbd4e5ab6, 0x3ea91014, 0xbb7b7d03, 0x3ae4384b, 0xbe43e530, 0xbf0191bf, 0xbe757ec5, 0xbd8889d2, 0xbcef5f67, 0x3d8bf790, 0x3e582f70, 0x3ecf2571, 0xbb337648, 0x3cfb47db, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc2ae685, 0x3f024b58, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbb7b7d03, 0x3ae4384b, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e582f70, 0x3ecf2571, 0x3e91e21a, 0xbdaba414, 0x3ce6f5ee, 0x3e76c42f, 0x3e518952, 0xbe492381, 0x3ea3943c, 0x3e399295, 0xbc3262f9, 0x3e2f8772, 0xbc2ae685, 0x3f024b58, 0x3e8d3fd8, 0xbd4d837c, 0x3dcc68c2, 0x3e0a900f, 0xbd744b77, 0x3d370e27, 0xbb7b7d03, 0x3ae4384b, 0xbe1b422c, 0x3f0758f6, 0xbe28a269, 0x3d0da36d, 0xbe757ec5, 0xbd8889d2, 0x3e582f70, 0x3ecf2571, 0xbc622877, 0xbefa4b3d, 0xbe83c471, 0xbe780ec4, 0xbe254915, 0xbd8083f0, 0x3e19d32e, 0xbd7b1579, 0x3ecd3960, 0x3dc4be81, 0xbe5048db, 0xbd41adc5, 0xbe61cce5, 0xbe80fd7b, 0xbeb46138, 0x3dd62d85, 0x3dcdf5db, 0xbd74a9ff, 0xbec16846, 0x3ee87fb9, 0xbd4e5ab6, 0x3ea91014, 0xbe43e530, 0xbf0191bf, 0x3efa8c8d, 0xbe6393a5, 0x3c288ea8, 0xbe5a4e46, 0xbcef5f67, 0x3d8bf790, 0xbb337648, 0x3cfb47db, 0xbefe9ed2, 0x3e7376fb, 0x3ecbe074, 0x3c4265c2, 0x3e91e21a, 0xbdaba414, 0x3e582f70, 0x3ecf2571, 0x3efa8c8d, 0xbe6393a5, 0xbe8b1acd, 0x3e6d5304, 0xbc3262f9, 0x3e2f8772, 0x3e19d32e, 0xbd7b1579, 0xbefe9ed2, 0x3e7376fb, 0x3e2d1e34, 0x3d487da1, 0xbd744b77, 0x3d370e27, 0xbeb46138, 0x3dd62d85, 0x3ea3943c, 0x3e399295, 0xbddd9c35, 0xbda219fa, 0xbe757ec5, 0xbd8889d2, 0xbe43e530, 0xbf0191bf, 0x3dcc68c2, 0x3e0a900f, 0xbc9d3f14, 0x3eacff74, 0xbe254915, 0xbd8083f0, 0xbb337648, 0x3cfb47db, 0xbe28a269, 0x3d0da36d, 0x3dc18f8c, 0x3e8aef19, 0xbe61cce5, 0xbe80fd7b, 0x3e518952, 0xbe492381, 0xbe83c471, 0xbe780ec4, 0x3d20d4ff, 0x3f176b21, 0xbd4e5ab6, 0x3ea91014, 0x3e8d3fd8, 0xbd4d837c, 0xbe5048db, 0xbd41adc5, 0x3eade380, 0x3e9c1d59, 0xbcef5f67, 0x3d8bf790, 0xbe1b422c, 0x3f0758f6, 0xbec16846, 0x3ee87fb9, 0x3e985fac, 0x3e1874d5, 0x3ce6f5ee, 0x3e76c42f, 0xbc622877, 0xbefa4b3d, 0x3c288ea8, 0xbe5a4e46, 0x3def0161, 0xbeae7e24, 0xbc2ae685, 0x3f024b58, 0x3ecd3960, 0x3dc4be81, 0x3ecbe074, 0x3c4265c2, 0xba4ea4b2, 0xbea61595, 0xbb7b7d03, 0x3ae4384b, 0x3dcdf5db, 0xbd74a9ff, 0x3e2102a8, 0xbd90b1f0, 0xbf0a500e, 0xbda357b4, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0x3e91e21a, 0xbdaba414, 0xbd744b77, 0x3d370e27, 0xbe254915, 0xbd8083f0, 0xbc3262f9, 0x3e2f8772, 0xbe757ec5, 0xbd8889d2, 0xbe61cce5, 0xbe80fd7b, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e91e21a, 0xbdaba414, 0xbe254915, 0xbd8083f0, 0x3ce6f5ee, 0x3e76c42f, 0xbc3262f9, 0x3e2f8772, 0xbe61cce5, 0xbe80fd7b, 0xbc2ae685, 0x3f024b58, 0xbd744b77, 0x3d370e27, 0xbd4e5ab6, 0x3ea91014, 0xbb7b7d03, 0x3ae4384b, 0xbe757ec5, 0xbd8889d2, 0xbcef5f67, 0x3d8bf790, 0x3e582f70, 0x3ecf2571, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e91e21a, 0xbdaba414, 0x3ce6f5ee, 0x3e76c42f, 0x3e518952, 0xbe492381, 0xbc3262f9, 0x3e2f8772, 0xbc2ae685, 0x3f024b58, 0x3e8d3fd8, 0xbd4d837c, 0xbd744b77, 0x3d370e27, 0xbb7b7d03, 0x3ae4384b, 0xbe1b422c, 0x3f0758f6, 0xbe757ec5, 0xbd8889d2, 0x3e582f70, 0x3ecf2571, 0xbc622877, 0xbefa4b3d, 0xbe254915, 0xbd8083f0, 0x3e19d32e, 0xbd7b1579, 0x3ecd3960, 0x3dc4be81, 0xbe61cce5, 0xbe80fd7b, 0xbeb46138, 0x3dd62d85, 0x3dcdf5db, 0xbd74a9ff, 0xbd4e5ab6, 0x3ea91014, 0xbe43e530, 0xbf0191bf, 0x3efa8c8d, 0xbe6393a5, 0xbcef5f67, 0x3d8bf790, 0xbb337648, 0x3cfb47db, 0xbefe9ed2, 0x3e7376fb, 0x3e91e21a, 0xbdaba414, 0x3e582f70, 0x3ecf2571, 0x3efa8c8d, 0xbe6393a5, 0xbc3262f9, 0x3e2f8772, 0x3e19d32e, 0xbd7b1579, 0xbefe9ed2, 0x3e7376fb, 0xbd744b77, 0x3d370e27, 0xbeb46138, 0x3dd62d85, 0x3ea3943c, 0x3e399295, 0xbe757ec5, 0xbd8889d2, 0xbe43e530, 0xbf0191bf, 0x3dcc68c2, 0x3e0a900f, 0xbe254915, 0xbd8083f0, 0xbb337648, 0x3cfb47db, 0xbe28a269, 0x3d0da36d, 0xbe61cce5, 0xbe80fd7b, 0x3e518952, 0xbe492381, 0xbe83c471, 0xbe780ec4, 0xbd4e5ab6, 0x3ea91014, 0x3e8d3fd8, 0xbd4d837c, 0xbe5048db, 0xbd41adc5, 0xbcef5f67, 0x3d8bf790, 0xbe1b422c, 0x3f0758f6, 0xbec16846, 0x3ee87fb9, 0x3ce6f5ee, 0x3e76c42f, 0xbc622877, 0xbefa4b3d, 0x3c288ea8, 0xbe5a4e46, 0xbc2ae685, 0x3f024b58, 0x3ecd3960, 0x3dc4be81, 0x3ecbe074, 0x3c4265c2, 0xbb7b7d03, 0x3ae4384b, 0x3dcdf5db, 0xbd74a9ff, 0x3e2102a8, 0xbd90b1f0, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0xbe757ec5, 0xbd8889d2, 0xbe254915, 0xbd8083f0, 0xbe61cce5, 0xbe80fd7b, 0xbd4e5ab6, 0x3ea91014, 0xbcef5f67, 0x3d8bf790, 0x3e91e21a, 0xbdaba414, 0xbd744b77, 0x3d370e27, 0xbe254915, 0xbd8083f0, 0xbd4e5ab6, 0x3ea91014, 0x3ce6f5ee, 0x3e76c42f, 0xbb7b7d03, 0x3ae4384b, 0x3e19d32e, 0xbd7b1579, 0xbe43e530, 0xbf0191bf, 0xbc3262f9, 0x3e2f8772, 0xbe757ec5, 0xbd8889d2, 0xbe61cce5, 0xbe80fd7b, 0xbcef5f67, 0x3d8bf790, 0xbc2ae685, 0x3f024b58, 0x3e582f70, 0x3ecf2571, 0xbeb46138, 0x3dd62d85, 0xbb337648, 0x3cfb47db, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc2ae685, 0x3f024b58, 0x3e19d32e, 0xbd7b1579, 0xbb337648, 0x3cfb47db, 0xbe1b422c, 0x3f0758f6, 0x3dcdf5db, 0xbd74a9ff, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbb7b7d03, 0x3ae4384b, 0xbeb46138, 0x3dd62d85, 0x3e518952, 0xbe492381, 0xbc622877, 0xbefa4b3d, 0x3efa8c8d, 0xbe6393a5, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e582f70, 0x3ecf2571, 0xbe43e530, 0xbf0191bf, 0x3e8d3fd8, 0xbd4d837c, 0x3ecd3960, 0x3dc4be81, 0xbefe9ed2, 0x3e7376fb, 0x3e91e21a, 0xbdaba414, 0xbe254915, 0xbd8083f0, 0x3ce6f5ee, 0x3e76c42f, 0x3e19d32e, 0xbd7b1579, 0x3e518952, 0xbe492381, 0x3ecd3960, 0x3dc4be81, 0x3ea3943c, 0x3e399295, 0xbe5048db, 0xbd41adc5, 0xbc3262f9, 0x3e2f8772, 0xbe61cce5, 0xbe80fd7b, 0xbc2ae685, 0x3f024b58, 0xbeb46138, 0x3dd62d85, 0x3e8d3fd8, 0xbd4d837c, 0x3dcdf5db, 0xbd74a9ff, 0x3dcc68c2, 0x3e0a900f, 0xbec16846, 0x3ee87fb9, 0xbd744b77, 0x3d370e27, 0xbd4e5ab6, 0x3ea91014, 0xbb7b7d03, 0x3ae4384b, 0xbe43e530, 0xbf0191bf, 0xbe1b422c, 0x3f0758f6, 0x3efa8c8d, 0xbe6393a5, 0xbe28a269, 0x3d0da36d, 0x3c288ea8, 0xbe5a4e46, 0xbe757ec5, 0xbd8889d2, 0xbcef5f67, 0x3d8bf790, 0x3e582f70, 0x3ecf2571, 0xbb337648, 0x3cfb47db, 0xbc622877, 0xbefa4b3d, 0xbefe9ed2, 0x3e7376fb, 0xbe83c471, 0xbe780ec4, 0x3ecbe074, 0x3c4265c2, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc2ae685, 0x3f024b58, 0x3e19d32e, 0xbd7b1579, 0xbb337648, 0x3cfb47db, 0xbe1b422c, 0x3f0758f6, 0x3dcdf5db, 0xbd74a9ff, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbb7b7d03, 0x3ae4384b, 0xbeb46138, 0x3dd62d85, 0x3e518952, 0xbe492381, 0xbc622877, 0xbefa4b3d, 0x3efa8c8d, 0xbe6393a5, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e582f70, 0x3ecf2571, 0xbe43e530, 0xbf0191bf, 0x3e8d3fd8, 0xbd4d837c, 0x3ecd3960, 0x3dc4be81, 0xbefe9ed2, 0x3e7376fb, 0x3e91e21a, 0xbdaba414, 0x3ce6f5ee, 0x3e76c42f, 0x3e518952, 0xbe492381, 0x3ea3943c, 0x3e399295, 0x3e2102a8, 0xbd90b1f0, 0x3e985fac, 0x3e1874d5, 0x3b136e98, 0x3eaf9f44, 0xbe1fa084, 0x3e4f90d2, 0xbc3262f9, 0x3e2f8772, 0xbc2ae685, 0x3f024b58, 0x3e8d3fd8, 0xbd4d837c, 0x3dcc68c2, 0x3e0a900f, 0xbe8b1acd, 0x3e6d5304, 0x3def0161, 0xbeae7e24, 0xbe82bda3, 0xbcac4cc9, 0xbe2e7652, 0x3d382fab, 0xbd744b77, 0x3d370e27, 0xbb7b7d03, 0x3ae4384b, 0xbe1b422c, 0x3f0758f6, 0xbe28a269, 0x3d0da36d, 0x3e2d1e34, 0x3d487da1, 0xba4ea4b2, 0xbea61595, 0x3e9c1202, 0xbcef1a5e, 0xbe256446, 0x3dfb9402, 0xbe757ec5, 0xbd8889d2, 0x3e582f70, 0x3ecf2571, 0xbc622877, 0xbefa4b3d, 0xbe83c471, 0xbe780ec4, 0xbddd9c35, 0xbda219fa, 0xbf0a500e, 0xbda357b4, 0xbc637232, 0x3d7a5272, 0x3eaf5ddd, 0xbe49ba0f, 0xbe254915, 0xbd8083f0, 0x3e19d32e, 0xbd7b1579, 0x3ecd3960, 0x3dc4be81, 0xbe5048db, 0xbd41adc5, 0xbc9d3f14, 0x3eacff74, 0x3dac8c0d, 0xbe17cdb6, 0xbd9e2133, 0xbf1d4c93, 0xbe210004, 0xbd4778d9, 0xbe61cce5, 0xbe80fd7b, 0xbeb46138, 0x3dd62d85, 0x3dcdf5db, 0xbd74a9ff, 0xbec16846, 0x3ee87fb9, 0x3dc18f8c, 0x3e8aef19, 0x3e45fa75, 0xbe8d4a20, 0x3ed6ab7f, 0x3ebfdb57, 0x3e47cd06, 0x3da2d4a2, 0xbd4e5ab6, 0x3ea91014, 0xbe43e530, 0xbf0191bf, 0x3efa8c8d, 0xbe6393a5, 0x3c288ea8, 0xbe5a4e46, 0x3d20d4ff, 0x3f176b21, 0xbe2a3cf1, 0xbdd42507, 0x3e3855b1, 0xbed7478e, 0xbe922f60, 0xbed26a28, 0xbcef5f67, 0x3d8bf790, 0xbb337648, 0x3cfb47db, 0xbefe9ed2, 0x3e7376fb, 0x3ecbe074, 0x3c4265c2, 0x3eade380, 0x3e9c1d59, 0x3e200a7a, 0x3d81ba49, 0x3e4bcbe4, 0xbe3b2ddb, 0x3cb60292, 0xbd6e8cb0, 0x3e91e21a, 0xbdaba414, 0x3e582f70, 0x3ecf2571, 0x3efa8c8d, 0xbe6393a5, 0xbe8b1acd, 0x3e6d5304, 0x3dac8c0d, 0xbe17cdb6, 0x3e4bcbe4, 0xbe3b2ddb, 0xbefba082, 0xbe195172, 0x3eb1f597, 0xbcaf830a, 0xbc3262f9, 0x3e2f8772, 0x3e19d32e, 0xbd7b1579, 0xbefe9ed2, 0x3e7376fb, 0x3e2d1e34, 0x3d487da1, 0x3e45fa75, 0xbe8d4a20, 0xbe1fa084, 0x3e4f90d2, 0xbdd0c34d, 0xbe55f5ad, 0x3ee0b8c9, 0xbe1a4ab7, 0xbd744b77, 0x3d370e27, 0xbeb46138, 0x3dd62d85, 0x3ea3943c, 0x3e399295, 0xbddd9c35, 0xbda219fa, 0xbe2a3cf1, 0xbdd42507, 0xbe2e7652, 0x3d382fab, 0x3e119ad4, 0xbec009a8, 0x3d3defc1, 0x3e919d1d, 0xbe757ec5, 0xbd8889d2, 0xbe43e530, 0xbf0191bf, 0x3dcc68c2, 0x3e0a900f, 0xbc9d3f14, 0x3eacff74, 0x3e200a7a, 0x3d81ba49, 0xbe256446, 0x3dfb9402, 0x3d9bd766, 0x3e46f156, 0x3eef1da3, 0x3e99828a, 0xbe254915, 0xbd8083f0, 0xbb337648, 0x3cfb47db, 0xbe28a269, 0x3d0da36d, 0x3dc18f8c, 0x3e8aef19, 0x3b136e98, 0x3eaf9f44, 0x3eaf5ddd, 0xbe49ba0f, 0xbddec721, 0xbe9a0a88, 0xbf02508c, 0x3ef54f35, 0xbe61cce5, 0xbe80fd7b, 0x3e518952, 0xbe492381, 0xbe83c471, 0xbe780ec4, 0x3d20d4ff, 0x3f176b21, 0xbe82bda3, 0xbcac4cc9, 0xbe210004, 0xbd4778d9, 0xbd22d17f, 0xbde6b3f7, 0x3dcafd5f, 0x3d795822, 0xbd4e5ab6, 0x3ea91014, 0x3e8d3fd8, 0xbd4d837c, 0xbe5048db, 0xbd41adc5, 0x3eade380, 0x3e9c1d59, 0x3e9c1202, 0xbcef1a5e, 0x3e47cd06, 0x3da2d4a2, 0xbe0d30ab, 0xbe26ae09, 0xbec11a5a, 0xbc9c8f08, 0xbcef5f67, 0x3d8bf790, 0xbe1b422c, 0x3f0758f6, 0xbec16846, 0x3ee87fb9, 0x3e985fac, 0x3e1874d5, 0xbc637232, 0x3d7a5272, 0xbe922f60, 0xbed26a28, 0x3d825a6b, 0xbe2d6627, 0x3ebb0671, 0xbd93ae46, 0x3ce6f5ee, 0x3e76c42f, 0xbc622877, 0xbefa4b3d, 0x3c288ea8, 0xbe5a4e46, 0x3def0161, 0xbeae7e24, 0xbd9e2133, 0xbf1d4c93, 0x3cb60292, 0xbd6e8cb0, 0x3e50fbd3, 0xbe6a138f, 0x3ed12233, 0x3cf0a0f6, 0xbc2ae685, 0x3f024b58, 0x3ecd3960, 0x3dc4be81, 0x3ecbe074, 0x3c4265c2, 0xba4ea4b2, 0xbea61595, 0x3ed6ab7f, 0x3ebfdb57, 0xbbc91835, 0xbad5d6d5, 0xbeba552c, 0x3e4da39e, 0x3e10cb7f, 0x3dc42580, 0xbb7b7d03, 0x3ae4384b, 0x3dcdf5db, 0xbd74a9ff, 0x3e2102a8, 0xbd90b1f0, 0xbf0a500e, 0xbda357b4, 0x3e3855b1, 0xbed7478e, 0xbd792a0f, 0xbebeeb8b, 0xbe9d3d2b, 0xbd13f9fd, 0x3eb53e23, 0x3d9f71ae, 0x3e91e21a, 0xbdaba414, 0xbc3262f9, 0x3e2f8772, 0xbd744b77, 0x3d370e27, 0xbe757ec5, 0xbd8889d2, 0xbe254915, 0xbd8083f0, 0xbe61cce5, 0xbe80fd7b, 0xbd4e5ab6, 0x3ea91014, 0xbcef5f67, 0x3d8bf790, 0x3ce6f5ee, 0x3e76c42f, 0xbc2ae685, 0x3f024b58, 0xbb7b7d03, 0x3ae4384b, 0x3e91e21a, 0xbdaba414, 0xbd744b77, 0x3d370e27, 0xbe254915, 0xbd8083f0, 0xbd4e5ab6, 0x3ea91014, 0x3ce6f5ee, 0x3e76c42f, 0xbb7b7d03, 0x3ae4384b, 0x3e19d32e, 0xbd7b1579, 0xbe43e530, 0xbf0191bf, 0x3e518952, 0xbe492381, 0xbe1b422c, 0x3f0758f6, 0x3ecd3960, 0x3dc4be81, 0xbc3262f9, 0x3e2f8772, 0xbe757ec5, 0xbd8889d2, 0xbe61cce5, 0xbe80fd7b, 0xbcef5f67, 0x3d8bf790, 0xbc2ae685, 0x3f024b58, 0x3e582f70, 0x3ecf2571, 0xbeb46138, 0x3dd62d85, 0xbb337648, 0x3cfb47db, 0x3e8d3fd8, 0xbd4d837c, 0xbc622877, 0xbefa4b3d, 0x3dcdf5db, 0xbd74a9ff, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc2ae685, 0x3f024b58, 0x3e19d32e, 0xbd7b1579, 0xbb337648, 0x3cfb47db, 0xbe1b422c, 0x3f0758f6, 0x3dcdf5db, 0xbd74a9ff, 0x3ea3943c, 0x3e399295, 0xbe83c471, 0xbe780ec4, 0x3c288ea8, 0xbe5a4e46, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbb7b7d03, 0x3ae4384b, 0xbeb46138, 0x3dd62d85, 0x3e518952, 0xbe492381, 0xbc622877, 0xbefa4b3d, 0x3efa8c8d, 0xbe6393a5, 0x3dcc68c2, 0x3e0a900f, 0xbe5048db, 0xbd41adc5, 0x3ecbe074, 0x3c4265c2, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e582f70, 0x3ecf2571, 0xbe43e530, 0xbf0191bf, 0x3e8d3fd8, 0xbd4d837c, 0x3ecd3960, 0x3dc4be81, 0xbefe9ed2, 0x3e7376fb, 0xbe28a269, 0x3d0da36d, 0xbec16846, 0x3ee87fb9, 0x3e2102a8, 0xbd90b1f0, 0x3e91e21a, 0xbdaba414, 0xbe254915, 0xbd8083f0, 0x3ce6f5ee, 0x3e76c42f, 0x3e19d32e, 0xbd7b1579, 0x3e518952, 0xbe492381, 0x3ecd3960, 0x3dc4be81, 0x3ea3943c, 0x3e399295, 0xbe5048db, 0xbd41adc5, 0x3e2102a8, 0xbd90b1f0, 0xbc9d3f14, 0x3eacff74, 0x3e985fac, 0x3e1874d5, 0xbc3262f9, 0x3e2f8772, 0xbe61cce5, 0xbe80fd7b, 0xbc2ae685, 0x3f024b58, 0xbeb46138, 0x3dd62d85, 0x3e8d3fd8, 0xbd4d837c, 0x3dcdf5db, 0xbd74a9ff, 0x3dcc68c2, 0x3e0a900f, 0xbec16846, 0x3ee87fb9, 0xbe8b1acd, 0x3e6d5304, 0x3dc18f8c, 0x3e8aef19, 0x3def0161, 0xbeae7e24, 0xbd744b77, 0x3d370e27, 0xbd4e5ab6, 0x3ea91014, 0xbb7b7d03, 0x3ae4384b, 0xbe43e530, 0xbf0191bf, 0xbe1b422c, 0x3f0758f6, 0x3efa8c8d, 0xbe6393a5, 0xbe28a269, 0x3d0da36d, 0x3c288ea8, 0xbe5a4e46, 0x3e2d1e34, 0x3d487da1, 0x3d20d4ff, 0x3f176b21, 0xba4ea4b2, 0xbea61595, 0xbe757ec5, 0xbd8889d2, 0xbcef5f67, 0x3d8bf790, 0x3e582f70, 0x3ecf2571, 0xbb337648, 0x3cfb47db, 0xbc622877, 0xbefa4b3d, 0xbefe9ed2, 0x3e7376fb, 0xbe83c471, 0xbe780ec4, 0x3ecbe074, 0x3c4265c2, 0xbddd9c35, 0xbda219fa, 0x3eade380, 0x3e9c1d59, 0xbf0a500e, 0xbda357b4, 0x3e91e21a, 0xbdaba414, 0xbe757ec5, 0xbd8889d2, 0xbd4e5ab6, 0x3ea91014, 0xbc2ae685, 0x3f024b58, 0x3e19d32e, 0xbd7b1579, 0xbb337648, 0x3cfb47db, 0xbe1b422c, 0x3f0758f6, 0x3dcdf5db, 0xbd74a9ff, 0x3ea3943c, 0x3e399295, 0xbe83c471, 0xbe780ec4, 0x3c288ea8, 0xbe5a4e46, 0xbc3262f9, 0x3e2f8772, 0xbe254915, 0xbd8083f0, 0xbcef5f67, 0x3d8bf790, 0xbb7b7d03, 0x3ae4384b, 0xbeb46138, 0x3dd62d85, 0x3e518952, 0xbe492381, 0xbc622877, 0xbefa4b3d, 0x3efa8c8d, 0xbe6393a5, 0x3dcc68c2, 0x3e0a900f, 0xbe5048db, 0xbd41adc5, 0x3ecbe074, 0x3c4265c2, 0xbd744b77, 0x3d370e27, 0xbe61cce5, 0xbe80fd7b, 0x3ce6f5ee, 0x3e76c42f, 0x3e582f70, 0x3ecf2571, 0xbe43e530, 0xbf0191bf, 0x3e8d3fd8, 0xbd4d837c, 0x3ecd3960, 0x3dc4be81, 0xbefe9ed2, 0x3e7376fb, 0xbe28a269, 0x3d0da36d, 0xbec16846, 0x3ee87fb9, 0x3e2102a8, 0xbd90b1f0, 0x3e91e21a, 0xbdaba414, 0x3ce6f5ee, 0x3e76c42f, 0x3e518952, 0xbe492381, 0x3ea3943c, 0x3e399295, 0x3e2102a8, 0xbd90b1f0, 0x3e985fac, 0x3e1874d5, 0x3b136e98, 0x3eaf9f44, 0xbe1fa084, 0x3e4f90d2, 0xbbc91835, 0xbad5d6d5, 0xbe0d30ab, 0xbe26ae09, 0x3eef1da3, 0x3e99828a, 0xbc3262f9, 0x3e2f8772, 0xbc2ae685, 0x3f024b58, 0x3e8d3fd8, 0xbd4d837c, 0x3dcc68c2, 0x3e0a900f, 0xbe8b1acd, 0x3e6d5304, 0x3def0161, 0xbeae7e24, 0xbe82bda3, 0xbcac4cc9, 0xbe2e7652, 0x3d382fab, 0xbd792a0f, 0xbebeeb8b, 0x3d825a6b, 0xbe2d6627, 0xbf02508c, 0x3ef54f35, 0xbd744b77, 0x3d370e27, 0xbb7b7d03, 0x3ae4384b, 0xbe1b422c, 0x3f0758f6, 0xbe28a269, 0x3d0da36d, 0x3e2d1e34, 0x3d487da1, 0xba4ea4b2, 0xbea61595, 0x3e9c1202, 0xbcef1a5e, 0xbe256446, 0x3dfb9402, 0xbefba082, 0xbe195172, 0x3e50fbd3, 0xbe6a138f, 0x3dcafd5f, 0x3d795822, 0xbe757ec5, 0xbd8889d2, 0x3e582f70, 0x3ecf2571, 0xbc622877, 0xbefa4b3d, 0xbe83c471, 0xbe780ec4, 0xbddd9c35, 0xbda219fa, 0xbf0a500e, 0xbda357b4, 0xbc637232, 0x3d7a5272, 0x3eaf5ddd, 0xbe49ba0f, 0xbdd0c34d, 0xbe55f5ad, 0xbeba552c, 0x3e4da39e, 0xbec11a5a, 0xbc9c8f08, 0xbe254915, 0xbd8083f0, 0x3e19d32e, 0xbd7b1579, 0x3ecd3960, 0x3dc4be81, 0xbe5048db, 0xbd41adc5, 0xbc9d3f14, 0x3eacff74, 0x3dac8c0d, 0xbe17cdb6, 0xbd9e2133, 0xbf1d4c93, 0xbe210004, 0xbd4778d9, 0x3e119ad4, 0xbec009a8, 0xbe9d3d2b, 0xbd13f9fd, 0x3ebb0671, 0xbd93ae46, 0xbe61cce5, 0xbe80fd7b, 0xbeb46138, 0x3dd62d85, 0x3dcdf5db, 0xbd74a9ff, 0xbec16846, 0x3ee87fb9, 0x3dc18f8c, 0x3e8aef19, 0x3e45fa75, 0xbe8d4a20, 0x3ed6ab7f, 0x3ebfdb57, 0x3e47cd06, 0x3da2d4a2, 0x3d9bd766, 0x3e46f156, 0x3eb1f597, 0xbcaf830a, 0x3ed12233, 0x3cf0a0f6, 0xbd4e5ab6, 0x3ea91014, 0xbe43e530, 0xbf0191bf, 0x3efa8c8d, 0xbe6393a5, 0x3c288ea8, 0xbe5a4e46, 0x3d20d4ff, 0x3f176b21, 0xbe2a3cf1, 0xbdd42507, 0x3e3855b1, 0xbed7478e, 0xbe922f60, 0xbed26a28, 0xbddec721, 0xbe9a0a88, 0x3ee0b8c9, 0xbe1a4ab7, 0x3e10cb7f, 0x3dc42580, 0xbcef5f67, 0x3d8bf790, 0xbb337648, 0x3cfb47db, 0xbefe9ed2, 0x3e7376fb, 0x3ecbe074, 0x3c4265c2, 0x3eade380, 0x3e9c1d59, 0x3e200a7a, 0x3d81ba49, 0x3e4bcbe4, 0xbe3b2ddb, 0x3cb60292, 0xbd6e8cb0, 0xbd22d17f, 0xbde6b3f7, 0x3d3defc1, 0x3e919d1d, 0x3eb53e23, 0x3d9f71ae, 0x3e91e21a, 0xbdaba414, 0x3e582f70, 0x3ecf2571, 0x3efa8c8d, 0xbe6393a5, 0xbe8b1acd, 0x3e6d5304, 0x3dac8c0d, 0xbe17cdb6, 0x3e4bcbe4, 0xbe3b2ddb, 0xbefba082, 0xbe195172, 0x3eb1f597, 0xbcaf830a, 0xbcc78909, 0x3e0e1c8b, 0x3d373a68, 0x3e4a3f82, 0xbd9ed648, 0xbf26e410, 0xbc3262f9, 0x3e2f8772, 0x3e19d32e, 0xbd7b1579, 0xbefe9ed2, 0x3e7376fb, 0x3e2d1e34, 0x3d487da1, 0x3e45fa75, 0xbe8d4a20, 0xbe1fa084, 0x3e4f90d2, 0xbdd0c34d, 0xbe55f5ad, 0x3ee0b8c9, 0xbe1a4ab7, 0xbe40da31, 0xbe42115a, 0xbe3e38e9, 0xbe25daac, 0xbe3339e1, 0x3ded0801, 0xbd744b77, 0x3d370e27, 0xbeb46138, 0x3dd62d85, 0x3ea3943c, 0x3e399295, 0xbddd9c35, 0xbda219fa, 0xbe2a3cf1, 0xbdd42507, 0xbe2e7652, 0x3d382fab, 0x3e119ad4, 0xbec009a8, 0x3d3defc1, 0x3e919d1d, 0xbf04cbeb, 0x3ead3cc5, 0xbe018139, 0x3d4120c8, 0xbe393909, 0x3d910ec3, 0xbe757ec5, 0xbd8889d2, 0xbe43e530, 0xbf0191bf, 0x3dcc68c2, 0x3e0a900f, 0xbc9d3f14, 0x3eacff74, 0x3e200a7a, 0x3d81ba49, 0xbe256446, 0x3dfb9402, 0x3d9bd766, 0x3e46f156, 0x3eef1da3, 0x3e99828a, 0x3dbbc1c1, 0xbea0f54a, 0x3cab4eb0, 0x3e98829b, 0x3dbac47c, 0xbf19b0e8, 0xbe254915, 0xbd8083f0, 0xbb337648, 0x3cfb47db, 0xbe28a269, 0x3d0da36d, 0x3dc18f8c, 0x3e8aef19, 0x3b136e98, 0x3eaf9f44, 0x3eaf5ddd, 0xbe49ba0f, 0xbddec721, 0xbe9a0a88, 0xbf02508c, 0x3ef54f35, 0x3ec515f2, 0x3e14c5de, 0xbe95f76e, 0xbf55c793, 0xbe40185c, 0xbe00930c, 0xbe61cce5, 0xbe80fd7b, 0x3e518952, 0xbe492381, 0xbe83c471, 0xbe780ec4, 0x3d20d4ff, 0x3f176b21, 0xbe82bda3, 0xbcac4cc9, 0xbe210004, 0xbd4778d9, 0xbd22d17f, 0xbde6b3f7, 0x3dcafd5f, 0x3d795822, 0x3e9f2cee, 0xbd8a1828, 0x3e76a376, 0x3edb77d9, 0xbe44b1a6, 0x3e3c8aae, 0xbd4e5ab6, 0x3ea91014, 0x3e8d3fd8, 0xbd4d837c, 0xbe5048db, 0xbd41adc5, 0x3eade380, 0x3e9c1d59, 0x3e9c1202, 0xbcef1a5e, 0x3e47cd06, 0x3da2d4a2, 0xbe0d30ab, 0xbe26ae09, 0xbec11a5a, 0xbc9c8f08, 0x3d943954, 0xbbdba675, 0x3e62280b, 0x3e9771a0, 0xbe1a1e6a, 0x3e424120, 0xbcef5f67, 0x3d8bf790, 0xbe1b422c, 0x3f0758f6, 0xbec16846, 0x3ee87fb9, 0x3e985fac, 0x3e1874d5, 0xbc637232, 0x3d7a5272, 0xbe922f60, 0xbed26a28, 0x3d825a6b, 0xbe2d6627, 0x3ebb0671, 0xbd93ae46, 0xbe779f8d, 0xbea21726, 0xbe403f85, 0xbebbbbe9, 0x3dd6fc27, 0xbe8d547b, 0x3ce6f5ee, 0x3e76c42f, 0xbc622877, 0xbefa4b3d, 0x3c288ea8, 0xbe5a4e46, 0x3def0161, 0xbeae7e24, 0xbd9e2133, 0xbf1d4c93, 0x3cb60292, 0xbd6e8cb0, 0x3e50fbd3, 0xbe6a138f, 0x3ed12233, 0x3cf0a0f6, 0x3f119a84, 0x3e7d0f87, 0xbe62b356, 0x3ea4ce76, 0xbc193aa0, 0x3cda7a52, 0xbc2ae685, 0x3f024b58, 0x3ecd3960, 0x3dc4be81, 0x3ecbe074, 0x3c4265c2, 0xba4ea4b2, 0xbea61595, 0x3ed6ab7f, 0x3ebfdb57, 0xbbc91835, 0xbad5d6d5, 0xbeba552c, 0x3e4da39e, 0x3e10cb7f, 0x3dc42580, 0x3e589d61, 0x3ec30337, 0xbebbb0d3, 0x3dd89f9a, 0x3e498fea, 0x3e042748, 0xbb7b7d03, 0x3ae4384b, 0x3dcdf5db, 0xbd74a9ff, 0x3e2102a8, 0xbd90b1f0, 0xbf0a500e, 0xbda357b4, 0x3e3855b1, 0xbed7478e, 0xbd792a0f, 0xbebeeb8b, 0xbe9d3d2b, 0xbd13f9fd, 0x3eb53e23, 0x3d9f71ae, 0x3f183777, 0xbe62a2ee, 0xbdd6619b, 0xbde90339, 0xbd7f466a, 0x3c897a90 }; static const uint32_t ref_cholesky_dpo[3111] = { 0x3f000000, 0x3f5db3d7, 0x0, 0x3e93cd3a, 0x3f5105ec, 0x3f3b70da, 0x0, 0x0, 0xbe838485, 0x3f3d6e02, 0x0, 0x3e9927dd, 0x3d7e0c28, 0x3f5ebdd4, 0x3f65057d, 0x0, 0x0, 0x0, 0x3f3a3698, 0x3e4832d6, 0x0, 0x0, 0x3f0c57ec, 0x3d9abf41, 0x3eaf479d, 0x0, 0x3f364419, 0xbda04cbf, 0xbecc3ece, 0x3e5f2388, 0x3f9c4f91, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f9f683c, 0x3f67bf66, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fad0ddb, 0x3f043a7f, 0x3ed2b428, 0x0, 0x0, 0x0, 0x0, 0x3f21af45, 0x3eccaabe, 0xbe7861a5, 0x3ef0ae64, 0x0, 0x0, 0x0, 0x3f719064, 0x3dc2e3bd, 0x3ee2a741, 0x3c980235, 0x3efff599, 0x0, 0x0, 0x3f547367, 0x3f3a6088, 0x3d054f79, 0x3d0f1f51, 0xbebde5f7, 0x3e1e6d26, 0x0, 0x3ef5d432, 0x3f16fd2f, 0xbe0b0773, 0x3e159041, 0xbe0aa01d, 0xbe16a250, 0x3dcb7cf1, 0x3f9d0810, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f811ca1, 0x3f2946e3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3faf7159, 0x3f40c62e, 0x3e9f91bc, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1ca24a, 0x3f009951, 0xbd28bf53, 0x3e9901b2, 0x0, 0x0, 0x0, 0x0, 0x3f608719, 0x3e937279, 0x3d929a62, 0x3da2f76c, 0x3f187ab6, 0x0, 0x0, 0x0, 0x3f123c02, 0x3f214e3f, 0xbea85eb5, 0xbe176f02, 0x3edabd60, 0x3e24ecc8, 0x0, 0x0, 0x3f635234, 0x3f05c177, 0x3e7fc645, 0x3d5ecfe1, 0xbdab63bb, 0xbcfb9056, 0x3ecf5956, 0x0, 0x3f5e424e, 0xbe2da5cc, 0xbdb2993f, 0x3e427c12, 0x3d1d7395, 0x3e4e9865, 0x3b897b82, 0x3ebc9108, 0x3f7d707b, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fab75f4, 0x3f428de4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6de464, 0x3ee41605, 0x3eead8e7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa7c175, 0x3f05ba69, 0x3e016506, 0x3f2a057b, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f859b0b, 0x3e80e72c, 0x3cb02b8d, 0x3e253296, 0x3ec7bc5f, 0x0, 0x0, 0x0, 0x0, 0x3f949b15, 0x3ee760df, 0x3b878e92, 0xbb6180aa, 0xbed32166, 0x3ea31834, 0x0, 0x0, 0x0, 0x3f799ffb, 0x3ec769c2, 0xbe3555b4, 0x3cd51530, 0xbea98cc9, 0xbebf9aa9, 0x3eff897b, 0x0, 0x0, 0x3fa3eccb, 0x3efe3329, 0xbeac6ec5, 0xbe88c951, 0xbdf8b671, 0x3d15ea8e, 0x3d3a081a, 0x3e53607c, 0x0, 0x3fa02ee8, 0x3f09d80b, 0xbcf12f29, 0x3e3ce591, 0xbd96bfa5, 0xbe8a9a04, 0xbe3f6faf, 0x3eb02902, 0x3e8335c8, 0x3fdd4638, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6b7920, 0x3f8475de, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fac4103, 0x3e8953db, 0x3f76742a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f638af1, 0x3e173cb7, 0x3f26fb3e, 0x3f3ffd4d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3faa0807, 0x3ed37a97, 0x3dd1cbf5, 0x3ddb6a65, 0x3f628013, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f5a921a, 0x3f0ac744, 0x3ec52941, 0xbe35a7c2, 0xbe08ff74, 0x3f2f479d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3faab41f, 0x3f08298a, 0x3e0cc863, 0xbca0d200, 0xbdb16315, 0xbea358b5, 0x3f2377d1, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb28187, 0x3f625399, 0x3eb6f0e2, 0x3e52440f, 0x3eeda6c8, 0x3e94796e, 0x3e26ef3a, 0x3f084cf8, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fe9916f, 0x3f5345fd, 0xbe1ae49d, 0x3e395ab4, 0xbc87a6cb, 0x3d723d17, 0x3ccf5733, 0xbd639284, 0x3f02e0d6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f82aaf8, 0x3ec08a03, 0x3ef42ab2, 0x3e2dfa36, 0xbd80e2c1, 0xbda9153b, 0x3d52024a, 0x3e81f5b5, 0xbdc42fd2, 0x3f1d4bad, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4f3829, 0x3ec42626, 0xbca9e043, 0x3eab1feb, 0x3ce52d21, 0xbd842df9, 0x3eac2bd0, 0x3eaefe3c, 0x3c72177f, 0x3ec2be32, 0x3e61b057, 0x0, 0x0, 0x0, 0x0, 0x3f8e4d5e, 0x3d4df680, 0x3f104ac4, 0x3e8845fc, 0x3ec27e58, 0x3d149770, 0x3ea33686, 0x3e8801bd, 0x3de24c62, 0x3d8cae81, 0xbd1f760c, 0x3f0009ae, 0x0, 0x0, 0x0, 0x3facee7c, 0x3f0e3808, 0x3dc6ee07, 0x3ee5fd75, 0xbe48c053, 0x3d8d1983, 0x3e8419f2, 0xbda8bfdf, 0xbe4056a2, 0x3e5e65c8, 0x3c505840, 0xbca63684, 0x3ec4ba9e, 0x0, 0x0, 0x3fbe0f69, 0x3dac65d3, 0xbe7580b5, 0xbe1db6e4, 0x3e78de12, 0x3edd6774, 0xbda97022, 0x3e4133d6, 0x3e8f80ed, 0x3eb41183, 0x3d2cf06c, 0xbc0dcf9f, 0xbd4a2fbb, 0x3e59466b, 0x0, 0x3f7320ec, 0xbd42aa76, 0x3efe9556, 0x3ef5b967, 0xbe687385, 0xbd784367, 0x3d292448, 0xbbe43c46, 0x3ecc3c5c, 0x3de49328, 0x3e0e3af1, 0xbd7a262f, 0x3bcebee0, 0xbd85da9a, 0x3d2f7d9e, 0x3e800000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eb504f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3eddb3d7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f000000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f0f1bbd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f1cc471, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f2953fd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f3504f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f400000, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f4a62c2, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f544395, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f5db3d7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f66c15a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f6f7751, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f77def6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f800000, 0x3fc66151, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f9c6eca, 0x3f912485, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f72f3d9, 0x3eba368c, 0x3f66aee6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f99c39f, 0x3f2c588b, 0x3ecaae9c, 0x3f8efd6a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa45b71, 0x3ea897d9, 0x3e93ef0b, 0x3ed38e5e, 0x3f2474e2, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fc08290, 0x3f1dfa41, 0x3e817b21, 0x3e4f02d0, 0xbdffd971, 0x3f2b8633, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb171d3, 0x3ed63c4c, 0x3edcb5b1, 0x3ebbdbf5, 0x3eb37eb4, 0x3d258cb4, 0x3f47e3e5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa7eb8e, 0x3f6d7fef, 0x3edc4a4e, 0x3ed12f98, 0x3dc009cd, 0xbeb7daa4, 0xbeb17800, 0x3f2989d6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f91e5da, 0x3f734e7a, 0x3e87c33a, 0x3f5a2622, 0x3e839b58, 0xbe5464df, 0x3d72f515, 0x3e961ec8, 0x3efb9bde, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f28b40e, 0x3f233daf, 0x3ea1e21c, 0x3efada62, 0x3cee0e88, 0x3db934d0, 0x3e1669d1, 0x3c2e3d62, 0xbec07903, 0x3f1c8887, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f89844b, 0x3f2f3cf2, 0x3f0d07d5, 0x3de866fe, 0xbe6b8030, 0xbeaa6179, 0x3f1d422a, 0x3eded9bc, 0xbe6afe9a, 0x3ca651c4, 0x3f1869a5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f9f6f60, 0x3f1f6e0c, 0x3ed5e753, 0x3e00b58a, 0xbd3bc139, 0x3dbcf436, 0x3ed02365, 0x3d170cb8, 0xbe9f9663, 0x3e0137b8, 0x3e0fc8cc, 0x3f533f36, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f629747, 0x3ec88672, 0x3ed7c0f2, 0xbe3284db, 0x3e8076a1, 0xbd158236, 0xbc7d7fc8, 0x3e02ad65, 0xbe88fdc9, 0x3da428c2, 0x3e158939, 0xbe18c19e, 0x3edcb926, 0x0, 0x0, 0x0, 0x0, 0x3f9fde05, 0x3f54fc87, 0x3ec872ab, 0x3ecd5456, 0x3e621ad5, 0xbe41ffab, 0x3e9be209, 0x3f2b3489, 0xbd90bbec, 0x3e25833f, 0x3e3718ff, 0xbe543e51, 0x3dd89711, 0x3eedad90, 0x0, 0x0, 0x0, 0x3f91da76, 0x3f5214db, 0x3e832618, 0x3e13423e, 0x3f31a590, 0xbdf00907, 0xbdb2a17c, 0x3f0d5ad3, 0xbe3b4f02, 0xbdd6c2d0, 0x3ec28036, 0x3a90e344, 0xbc213402, 0xbe6b1116, 0x3e7b822d, 0x0, 0x0, 0x3f205c2d, 0x3f7b6b31, 0x3e28d4db, 0x3ecc9368, 0x3e52fa09, 0xbdceb25b, 0xbe7c437c, 0x3db2c001, 0xbebd85e3, 0x3e9abcf9, 0x3b6f40fa, 0xbcc5f309, 0xbdb08688, 0x3e634aa3, 0xbcd33ac4, 0x3f0406f9, 0x0, 0x3fc0f458, 0x3f305ef3, 0x3ec418da, 0x3eec5aae, 0x3e331120, 0x3e2114b9, 0xbca5377f, 0x3eb69da8, 0x3e008ecd, 0xbe4db979, 0xbc674010, 0x3ee69cda, 0x3dbfb34f, 0x3ce60b73, 0xbbb5564e, 0xbd0b6e81, 0x3e17f757, 0x3ffed00c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd17cd5, 0x3fc40447, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40023062, 0x3f69519c, 0x3fc2c6c7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fde73b7, 0x3f72ace5, 0x3f092a3b, 0x3f9f52f7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa7bce4, 0x3f1477bc, 0x3ee96652, 0x3e2b093e, 0x3fa98274, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fde53f2, 0x3f8079b1, 0x3f5bab55, 0x3d7e5039, 0x3f261e96, 0x3f95520c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fcf000c, 0x3f9d8d20, 0x3f4cea61, 0x3e80bfcc, 0x3eebda8c, 0x3ec99979, 0x3f81c368, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f984f0b, 0x3db1fea7, 0x3ee4f662, 0x3e8a414d, 0x3f459096, 0x3f0af824, 0x3e08e904, 0x3f7fa105, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa7bebb, 0x3fa7575a, 0x3e46c933, 0x3e44755c, 0x3ea4b71e, 0x3e8b797f, 0x3dabd6c8, 0xbe2152aa, 0x3f8132e0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fbcc768, 0x3e9024a3, 0x3f03269b, 0x3f42a080, 0x3f1229ab, 0x3f879838, 0x3e4c8c48, 0xbda18021, 0xbcced5a8, 0x3f75356d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdcd9e8, 0x3f768946, 0x3f11e8f3, 0x3d834623, 0xbe320c0d, 0x3e8640da, 0x3e8b5d0c, 0x3e3de4b6, 0x3ebd51ad, 0x3e81ca64, 0x3f6ba7a5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd754f7, 0x3f082a0b, 0x3f88b972, 0x3ec00e29, 0x3e6211e4, 0x3f08d6fe, 0xbe63a8fa, 0x3e8986fb, 0xbe81476a, 0x3e961ac9, 0x3e60a3dc, 0x3f5fa451, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd01a6e, 0x3f4cf231, 0x3ecfb323, 0x3ba33586, 0x3ea69247, 0x3deba617, 0x3e827ad2, 0x3ec3efab, 0x3e8ca65f, 0xbe116fd0, 0x3d87f8df, 0x3f26b9f6, 0x3f348717, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fda05ff, 0x3f6771a0, 0x3eb9ea2c, 0x3e3917a6, 0x3e9691f7, 0x3ed31268, 0x3ebd6d87, 0x3f194be0, 0xbe1a8142, 0xbe4e4b11, 0x3da83152, 0x3f0a14ac, 0x3eeb2c85, 0x3f86ccf4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fa733f3, 0x3f1d1042, 0x3f30e33b, 0xbdd776b5, 0x3ef5ad97, 0x3ea845a8, 0x3f24bba0, 0x3ef244f1, 0xbe425934, 0x3e9974ac, 0x3c6614d8, 0x3e167906, 0x3e3fbcac, 0x3eca7c36, 0x3f49449b, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdf9f18, 0x3f1d4800, 0x3f1fece6, 0x3f0d6a51, 0xbd765a7f, 0x3e8eeb70, 0x3ec3d74b, 0x3ecbcc7e, 0x3d9dffcf, 0xbe2168df, 0xbe08190e, 0x3d0a229c, 0x3d1ef589, 0x3db40187, 0x3eacdd97, 0x3f30b94a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ffd99ba, 0x3f7e6fb2, 0x3f0f3b87, 0x3d7fee6f, 0x3de7a1aa, 0x3b7ea369, 0x3d2bc6fb, 0x3d64b17d, 0x3da3e0b3, 0xbd9c4fda, 0x3e154967, 0xbd9e5677, 0x3e285852, 0x3e2294d2, 0xbe93799f, 0x3edad112, 0x3f528f2e, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3facfbe7, 0x3f47586e, 0x3ecae13e, 0x3ddf2103, 0xbd68a5ce, 0x3eb620dd, 0x3e8820e0, 0x3ec13cc3, 0x3d59d9dc, 0xbe5a1c37, 0x3e01225a, 0x3e7aaf69, 0x3eeff838, 0x3ee18727, 0x3d3497b2, 0xbc7cd569, 0xbe4623ca, 0x3f406dcf, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3faddd7c, 0x3f9cd3ce, 0x3ee5875d, 0x3e248c15, 0x3f453193, 0x3e2d7a27, 0x3ef2a046, 0x3e051b2c, 0x3e2bbb51, 0xbe622169, 0x3db2613f, 0x3e4d1c1e, 0xbcdc504a, 0x3d812a54, 0xbebba39a, 0xbd5d1b5a, 0xbdbea01d, 0x3ef0bd3a, 0x3f3d13e7, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x4003bb43, 0x3ed0e300, 0x3f031c42, 0x3f109e7a, 0x3e774141, 0x3f014d84, 0x3edf8cd0, 0x3e76687f, 0xbdc5573d, 0x3e1f0d4d, 0xbe3c054b, 0x3ecc81b3, 0xbef8a0ef, 0x3e71921b, 0x3e815f3a, 0x3c9f6064, 0xbdf8f2df, 0x3e1a92ea, 0x3d73e74e, 0x3ef0d293, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3facec69, 0x3f2b8a20, 0x3f562f52, 0x3de743af, 0x3ea1aaaa, 0x3f1b2da5, 0x3eab4d6c, 0xbe87e2a6, 0x3d84c64a, 0xbd42cfa3, 0xbea134f9, 0xbc3d9575, 0xbed62816, 0xbcfd85d5, 0xbe62851f, 0x3e1bc900, 0xbe58912c, 0xbd97977a, 0x3d4acd2f, 0xbc3264fb, 0x3f25a676, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fcc3179, 0x3f022e4a, 0x3e648cdf, 0x3f269697, 0x3eb8ccfa, 0x3c645a85, 0x3f0e0695, 0x3e6882e1, 0x3c61b8de, 0xbd4d43b7, 0xbe53ba18, 0x3b919a5b, 0x3e25a656, 0x3e2379f6, 0x3e02d45e, 0x3df6f0b7, 0x3f091655, 0x3ecbeb20, 0xbd769583, 0xbd951e4c, 0xbdf04e1a, 0x3f2520c9, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb301be, 0x3e8d19e9, 0x3f24aa50, 0x3e31f7f3, 0x3e80be5c, 0x3e7bfe2b, 0x3dfe6726, 0x3e8cdb69, 0x3e32022b, 0x3de75f11, 0x3c3c3ef7, 0x3e8cb874, 0x3e05faf3, 0x3c9f1372, 0x3dd6ba26, 0x3e6d1ea0, 0xbd6f836c, 0xbe91b4c0, 0xbdab98c2, 0x3e98c134, 0xbc7c5055, 0xbd3c82d4, 0x3f1a4db4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd30b04, 0x3f2a9af8, 0x3d7e078d, 0x3f2dcf40, 0x3ebfb78b, 0x3eee2e8f, 0x3f149fe6, 0x3e40f4ba, 0x3df94fd7, 0x3e4f5336, 0xbe3b6992, 0xbe799d4e, 0xbe66afb9, 0x3e47d99a, 0xbe084e2f, 0xbda8dfc8, 0xbd7209c7, 0x3daf3e3b, 0xbe253f51, 0xbeaf18b4, 0xbc75fd76, 0x3e89d61f, 0xbdb40f1f, 0x3ec91cea, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fe6958f, 0x3f9d887e, 0x3f942bc5, 0x3da7cd2b, 0x3ef28d20, 0x3e84ac2f, 0x3ecb6b9c, 0x3eb5499f, 0x3e56340c, 0xbe185b4f, 0xbe43fd6d, 0x3e730c6d, 0x3de55016, 0x3d8e4a1c, 0xbd1d7e16, 0x3de81a83, 0x3bd81574, 0x3e7f68af, 0x3e61c6a6, 0xbe102d47, 0x3dec6dab, 0xbe24133f, 0xbdb0bf8c, 0x3e9e1d23, 0x3f11aa31, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd1922c, 0x3f640eb1, 0x3f1a6aae, 0x3e81a394, 0x3f2044ac, 0x3e29c5e5, 0x3e8263ba, 0x3dec7d26, 0x3e99e3ce, 0xbeb42111, 0x3cd06a71, 0xbdb3cea7, 0x3edde5a6, 0xbce1e008, 0xbed6bc1f, 0xbe254da8, 0x3e4b5427, 0x3f1e4fb9, 0x3bbebad8, 0xbe8e6d28, 0xbe8c801d, 0x3e814259, 0xbe3bc874, 0x3eb6982a, 0x3e8d05d8, 0x3e93855c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb7a845, 0x3f5770f0, 0x3e9f1b20, 0x3dd47221, 0x3ec97360, 0x3e48c3dc, 0x3de3873d, 0x3ebde9e2, 0x3ef12513, 0x3cb30022, 0xbcbd66d0, 0x3e5d9024, 0x3e834f6f, 0x3e76df67, 0x3ed08fe6, 0x3d2fb9d2, 0xbdc658d8, 0x3eb784e4, 0x3cb98c8a, 0xbcdd1392, 0x3d9fe26a, 0x3e0c5697, 0xbe4b5028, 0xbacaebd0, 0xbe3b3d87, 0xbe2f5a6d, 0x3edaad0c, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb8e880, 0x3eebce56, 0x3f0a2ab2, 0x3ee7860b, 0x3f07c3bb, 0x3ec56276, 0x3ea99425, 0x3e6f1147, 0x3d8130d6, 0x3e4356fe, 0xbdc396b4, 0xbdf45454, 0xbe44d9cd, 0x3df2a441, 0xbdbb511f, 0xbdab5415, 0xbec698e0, 0x3d40ff7f, 0xbe84fabb, 0xbeaaed36, 0x3eb3ec66, 0x3ddde002, 0x3d9b27a0, 0x3dafd7c1, 0x3e00b1aa, 0x3d57c6a6, 0xbe899da0, 0x3e7f182c, 0x0, 0x0, 0x0, 0x0, 0x3fe5880a, 0x3f1fdf8c, 0x3f4561d8, 0x3e99ea6f, 0xbdcbf0d6, 0x3efdde26, 0x3caa7198, 0x3eaa86b6, 0x3d1fd57d, 0x3e74a256, 0x3e1996c6, 0x3e138086, 0x3ebcc931, 0x3e57df72, 0x3e08b418, 0x3eafd807, 0xbc8d5878, 0xbf08bca4, 0xbe983185, 0x3e419b56, 0x3dd42e35, 0x3e3693a4, 0x3dfc6018, 0x3dd5c1a9, 0x3e335f87, 0x3e5deb5d, 0xbea6af52, 0xbd0bef14, 0x3e96f9e4, 0x0, 0x0, 0x0, 0x3fc583ec, 0x3f76f355, 0x3f379767, 0x3dfc5afc, 0x3f682cab, 0x3e9231b1, 0x3ebf488b, 0x3e931e90, 0xbd35737b, 0xba78aea8, 0x3da06f84, 0x3e6a2d9e, 0x3e6a6512, 0xbdf785b0, 0x3efbcc72, 0x3e2c97eb, 0xbdd1977c, 0xbdc246f1, 0x3d78ffbd, 0x3e906d7e, 0x3c977699, 0xbe289647, 0xbc02664f, 0xbc8de41c, 0x3e55cf5a, 0xbd66e2c9, 0x3e223add, 0xbd1ea502, 0xbdb44bea, 0x3eb41992, 0x0, 0x0, 0x3fb82540, 0x3f5eb20d, 0x3efebc0c, 0x3e4abbd9, 0x3f0aa8bc, 0x3ea50875, 0x3e48e6fa, 0x3e26f2b5, 0x3ec47b5f, 0xbe00434d, 0xbeadf6ab, 0xbe66ea82, 0xbe76ea35, 0x3da69860, 0x3dd307ad, 0x3ee8a413, 0x3e3637e3, 0xbde60450, 0xbe4b1942, 0x3c1b32db, 0x3eb7f8e0, 0xbbe2881d, 0x3c7ac888, 0x3e074632, 0xbcceb64b, 0x3c97665c, 0xbdceb1de, 0xbd0d1509, 0xbd991fa7, 0xbdd33771, 0x3db1562b, 0x0, 0x3fe0be31, 0x3f81548a, 0x3f29b060, 0x3e68e017, 0x3f3dfdbb, 0x3e94b3f3, 0x3de39e37, 0xbe190357, 0x3e904fbf, 0x3ed4ef3d, 0xbe848e31, 0x3d8e1940, 0xbdf93878, 0x3f0e997c, 0x3e47e307, 0xbcff24c7, 0xbe1d0e4a, 0xbe505ec4, 0x3c516c4a, 0xbebfb6cd, 0x3b9f50f9, 0x3e32a77d, 0x3cf347c8, 0x3cc28577, 0x3e906a10, 0xbe1435d3, 0xbe38a553, 0xbe5ed6db, 0xbe036a23, 0xbe3162b7, 0xbe50b8c7, 0x3d31b0af, 0x401ab7a6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40061126, 0x3fe80c14, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd941f9, 0x3ed5e08b, 0x3f9d2a7d, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd74bb3, 0x3f304d4f, 0x3f163839, 0x3f896eea, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fc3c04c, 0x3ece94f6, 0x3edcbc07, 0x3df75abf, 0x3fa40b4f, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x4001717c, 0x3f19b4bb, 0x3f32ff99, 0x3dd7e5a8, 0x3f392e5d, 0x3f7b7949, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd246e3, 0x3f184b09, 0x3ea3d6dd, 0xbd8e9a16, 0x3f0b18fc, 0xbe96af17, 0x3f88eb09, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fee673b, 0x3f1abdde, 0x3f163587, 0x3f1e383c, 0x3ef23e21, 0x3d862f3d, 0x3f0adf56, 0x3f902fa4, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fc65885, 0x3f0f73d4, 0x3ec5dc61, 0x3ebcc7e9, 0x3f0c84ae, 0xbe02c256, 0x3eb39489, 0xbc5949a5, 0x3f9bf79e, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40068cdf, 0x3f5f0d68, 0x3eac7b1b, 0x3ef68c95, 0x3ed978dc, 0x3e79d036, 0x3f30cb63, 0x3da3cc80, 0x3ea9d397, 0x3f88a7e5, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fd3a07e, 0x3e8767eb, 0x3f170e1d, 0x3e7b7bc5, 0x3f80168d, 0x3e8ae6fb, 0x3e900027, 0x3f285b86, 0xbd229d4e, 0xbda51752, 0x3f4e638a, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fda2416, 0x3f040035, 0xbd818679, 0x3d56da0b, 0x3ecba874, 0xbe1a63b8, 0x3f06f4dc, 0x3d7bafb9, 0x3e3f0b10, 0xbe277b60, 0xbd9ca24f, 0x3f3f15bd, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x4014add8, 0x3f6a5edf, 0x3ea1e6f6, 0x3eedf8d1, 0x3e464816, 0x3edec475, 0x3eff6508, 0x3ec5d6c0, 0x3e039ca3, 0x3c9c3631, 0x3e6bdfdd, 0xbc90797f, 0x3f0d5b49, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fb1120c, 0x3e482b8f, 0x3e783bb3, 0x3dffd899, 0x3f1efa0c, 0x3e33d22f, 0x3e87c29b, 0x3e8b3504, 0x3e5d753f, 0x3e0bdad2, 0x3ef63be5, 0x3e95dc6c, 0x3e1f4ae9, 0x3f4bcf73, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ffa8e56, 0x3f2f89a7, 0x3f1d5f90, 0x3ef7a25a, 0x3e8b26e3, 0x3ea3e8e9, 0x3dc86225, 0xbd6e5718, 0x3e222d27, 0xbe225cd9, 0xbd8c9c09, 0xbe7b3653, 0xbe092aeb, 0xbe3ca598, 0x3f41f9a6, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ffa4e9a, 0x3f5bf783, 0x3ee533cf, 0x3f1cadac, 0x3e6ef295, 0x3e0f3ff3, 0xbe52f12b, 0x3df4eb3c, 0x3f234fef, 0x3e646ba0, 0x3e70b47a, 0x3e48c2eb, 0x3dcc57f8, 0xbe3fe3f9, 0xbdd93e4c, 0x3f6a1999, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdb5581, 0x3ead2780, 0x3e4c5c87, 0x3ebbde25, 0x3e60f959, 0xbe48f6f3, 0x3ee39afb, 0x3e395c5d, 0x3f2016dd, 0xbe38374a, 0x3e5fe311, 0xbcd4bcd8, 0xbd9a28b1, 0xbe4f5356, 0xbee61cb1, 0x3eaea4b7, 0x3f4f6ef0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fbabd7f, 0x3f3c2e80, 0x3f1d8f7c, 0x3e14e974, 0x3e088ea2, 0xbdba3693, 0x3f4c3fb8, 0x3ec313ea, 0xbcfcd2b4, 0xbe0fd4e7, 0x3ec43af9, 0xbe91c521, 0x3dc4f1af, 0xbe72d40b, 0x3e791b64, 0xbefba323, 0x3dc3ec22, 0x3f1d6961, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdf4c09, 0x3f262261, 0x3e200e2c, 0xbdd0e15c, 0x3f071e23, 0x3d3d3329, 0x3e1aaea2, 0x3ebfd1dd, 0x3e958a6a, 0xbda9cb5c, 0xbd1829d1, 0xbcdfa6db, 0x3e1f374b, 0xbe85f74d, 0x3e6d8843, 0x3aca93bc, 0xbe3b0616, 0x3ecb9c4a, 0x3f484c42, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x4004bb00, 0x3f701706, 0x3ef9cdfa, 0x3ee22fa3, 0x3dbda156, 0x3e817f81, 0x3f14b38d, 0x3db14b55, 0x3ed9d4f1, 0x3d97b7f4, 0xbd9edc16, 0xbed9ce36, 0xbe48b4c0, 0xbded8160, 0xbe7f4207, 0xbdf07be7, 0x3e585371, 0x3df08d17, 0xbe9c4f81, 0x3eefe6f3, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fcbbb9f, 0x3f4946fe, 0x3e869e93, 0x3e828a03, 0x3ee99eb5, 0xbd4dae2a, 0x3ee5fbcd, 0xbd862458, 0x3b676e50, 0x3e45e165, 0x3e8652f3, 0x3d8bef0e, 0x3eb7a481, 0xbe384fa9, 0xbea486b8, 0x3ea11a93, 0xbe15d384, 0xbd7ed1e9, 0xbd4b3ced, 0xbe1facf3, 0x3f4acb23, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3f8363da, 0x3f81dacd, 0x3e9ef900, 0x3e340578, 0x3ec843e9, 0x3ebde302, 0x3e31951e, 0x3ededa65, 0x3ece5899, 0xbdccf1dc, 0x3ed33a59, 0x3e44a3d6, 0x3e19131a, 0x3dff82e7, 0x3ebcb10f, 0x3e01a990, 0x3e81a1c1, 0x3cf03d87, 0x3de547c3, 0xbd09181f, 0xbe5d41d6, 0x3f1c0919, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fbf3e2b, 0x3f298a07, 0x3e3bdc80, 0x3e45dc7b, 0x3f652d65, 0x3eb4c6d9, 0x3e724266, 0x3e8b620f, 0x3f3ff845, 0x3e2ff083, 0x3e7cad18, 0xbde73239, 0xbcad5015, 0xbdb55ea1, 0x3e3238ae, 0x3ec0a613, 0x3edb34f1, 0xbcd7cbdd, 0x3b622300, 0xbdcc1aab, 0xbe19bdbc, 0x3d28f39b, 0x3f04a917, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40038518, 0x3f091d10, 0x3df1e1a8, 0x3e4076ba, 0x3e611f5b, 0x3e0ba1c4, 0x3e955d81, 0x3ed4cdff, 0x3f1f050d, 0x3e2aeb6e, 0x3e27ed00, 0x3d4fd288, 0xbd1e3a21, 0xbd5cfb0c, 0xbc3e4c82, 0x3db732a2, 0x3f0b6fcf, 0xbe4d4e3b, 0xbdc19890, 0xbe63f631, 0xbe497257, 0xbd586394, 0xbb6d7e7a, 0x3eba3192, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ff4fd67, 0x3f4d98db, 0x3efc9456, 0x3ede99dc, 0x3ef485be, 0xbe5d5716, 0x3e180fac, 0xbcd7b6b0, 0x3f2d29f1, 0x3eadea70, 0xbd14f101, 0x3d5d78f0, 0x3d0b9f21, 0x3e5bf0e0, 0xbd72f223, 0x3ef438d5, 0x3eceea10, 0x3dfdd034, 0x3c9bb2e5, 0xbe88bc13, 0xbec776ed, 0x3e233ad2, 0x3e25fb61, 0x3de69b4d, 0x3f0e4c24, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fdd6d17, 0x3f8355b0, 0x3ef6881a, 0x3e0a89a7, 0x3f5cc9a4, 0x3dff5eed, 0x3eab9fb5, 0xbbbd9084, 0xbe480458, 0x3dbba655, 0x3edc293e, 0xbe22b48d, 0x3c9931ac, 0x3d38596d, 0xba747cca, 0x3de1efca, 0xbc05230d, 0x3e7d422d, 0x3e99b04f, 0xbeb90482, 0xbdaf29d9, 0x3e58e32d, 0x3dd96f06, 0xbd322a63, 0x3e50c287, 0x3ebaa0a0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x40038fb1, 0x3f12c6b5, 0xbd5c574f, 0xbe5a89cc, 0x3eb3dc17, 0xbe19bec5, 0x3e79b1db, 0x3e7253b3, 0x3e19363c, 0x3ebcfdd1, 0x3e2ac125, 0xbd04faaa, 0xbed000fb, 0xbeaa901a, 0xbe21e2fe, 0x3ad7ec32, 0xbd80f696, 0x3e1c00ca, 0xbc2c091a, 0xbe4b234c, 0xbe6b89b7, 0x3ebdcf11, 0xbec25ae3, 0x3e11bd17, 0xbce7e7d0, 0xbe0dba43, 0x3f44b760, 0x0, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3ffe22aa, 0x3f7cfe11, 0x3f337c3a, 0x3f27bd86, 0x3ee47600, 0xbdc0d10c, 0x3e96a2c6, 0x3e85fa4c, 0x3ebfef55, 0xbd8164c2, 0x3ded03f1, 0xbd82b722, 0x3eed3565, 0x3e07d765, 0xbd2f1a15, 0x3eaf3aac, 0xbed7240a, 0x3e68d67b, 0x3db111bd, 0xbd11d08e, 0x3f0686c1, 0x3e82cfd6, 0x3ed57861, 0x3e7ccf21, 0x3d513994, 0xbe4e7264, 0x3e99752d, 0x3ea466fe, 0x0, 0x0, 0x0, 0x0, 0x0, 0x3fca3b9f, 0x3f1eb216, 0x3ed12b35, 0x3e823f19, 0x3f08f71e, 0x3ef499a3, 0x3a527070, 0x3e65e902, 0xbefc1e08, 0xbd442ce7, 0xbd20311e, 0x3da108f3, 0x3e1869dd, 0xbe82ab3c, 0x3eefc711, 0xbe2bfdd2, 0xba882a00, 0x3d61be1e, 0xbe127a55, 0xbe0bf1ef, 0xbe02c802, 0xbd0d7c39, 0xbdf1f6e3, 0x3e0412e0, 0xbe2d032b, 0xbe016185, 0x3daf3008, 0xbd563b6a, 0x3ec64feb, 0x0, 0x0, 0x0, 0x0, 0x3fd33c8d, 0x3f5dd138, 0x3f0887eb, 0x3cbbbb64, 0x3ec4c026, 0x3ddd73bf, 0x3ed6ace1, 0x3e891ccf, 0xbd64a411, 0x3df7409b, 0x3edd7536, 0x3dd22501, 0x3dbc15ff, 0xbd01db98, 0x3f0922c8, 0x3e571628, 0xbd857de1, 0x3e1ed3bd, 0x3e2894ab, 0xbcdcb893, 0xbe35f149, 0x3ee86239, 0xbe4170ec, 0x3e2f08e9, 0x3dd07560, 0xbe3575b9, 0x3e33724e, 0xbe2282d6, 0x3e35eb31, 0x3e8b5f6b, 0x0, 0x0, 0x0, 0x40005364, 0x3ee57533, 0x3ed19026, 0x3efdd8a8, 0x3ebd9392, 0x3e1ff243, 0xbcf6c8cf, 0x3f1ad9f3, 0xbe2657bc, 0xbe3a87c6, 0x3e309f61, 0x3dd5a70b, 0x3edb5fed, 0x3e4186bc, 0x3d92a76f, 0xbdcd0c38, 0x3d65aed6, 0xbe471fdf, 0x3e16a605, 0xbda1eb83, 0xbd770f7d, 0x3c2be228, 0x3e4dfb35, 0xbe78407e, 0xbe8c71e3, 0x3e54513e, 0x3e92d64f, 0xbcce5247, 0x3d8d404d, 0xbe5c0897, 0x3ea5f01a, 0x0, 0x0, 0x3fe6ff66, 0x3eba9146, 0x3c83dfaf, 0x3edd2647, 0x3f23870b, 0x3ebed99a, 0x3d846b61, 0x3c749396, 0x3eb2262b, 0x3dcb9cb3, 0x3ed9c0af, 0xbe8636b0, 0xbdea3fb3, 0x3e8b0f85, 0x3d9075a7, 0x3bfc4054, 0x3e8805ae, 0x3d3492de, 0x3dd051f2, 0x3ea45d17, 0x3e7d6ded, 0x3eb93715, 0xbe35382e, 0xbdbcfbec, 0xbe46ccf8, 0xbe2ad784, 0x3ce953e2, 0xbd6aed44, 0xbd8de512, 0xbe4462b2, 0xbdd75b3c, 0x3ecb7776, 0x0, 0x3fdd4ae8, 0x3eb04174, 0x3f15201d, 0x3f08b381, 0x3e381d21, 0x3e984c2d, 0x3e1a687b, 0x3e4df753, 0x3e43234f, 0xbea4fff1, 0x3eeabe27, 0x3d6752b6, 0xbeefa999, 0xbdf415c8, 0x3e9215c4, 0x3e2d84d5, 0xbca81fe2, 0x3e4dda43, 0x3c704ffd, 0x3e31eafa, 0xbe8e807a, 0x3e8cfc51, 0x3d1021c0, 0x3d84c43c, 0xbe93af2d, 0x3e945ba9, 0x3d656f40, 0xbe7b9218, 0x3eaef8b3, 0xbc5c67b7, 0xbda7da4e, 0xbe8d1593, 0x3e0aa5f4, 0x3f5db3d7, 0x0, 0x3e93cd3a, 0x3f5105ec }; static const uint32_t ref_uptriangular_dpo[3111] = { 0x40000000, 0x3e87e53d, 0x3f2f4102, 0xbf9cc471, 0x3ec75ec3, 0xbdd6000a, 0x3ed152f8, 0xbe052e1f, 0xbea6236e, 0x3e0c9656, 0x3fa80ce1, 0x3f00fe02, 0xbf022613, 0x3eeb5d66, 0x40483094, 0x40d308aa, 0xc093d8d5, 0xbdcec635, 0x3f52f9ef, 0x3ffc6696, 0x4015b8f8, 0x3ff84e5d, 0xc04063ed, 0xc0dd5539, 0x3f7b727b, 0xbe63d452, 0xc011a974, 0xc092d9ae, 0x4014c24c, 0xbf9f0fcd, 0xbe63c787, 0x3fa3260e, 0xbf057d65, 0x3ec60845, 0x3fc96e10, 0x3fdd895b, 0xbe640886, 0x3e649e6b, 0xc0590aae, 0x3f91b5a1, 0x40483e79, 0xc046ec6f, 0xc0a1f6f2, 0xbeddd6c7, 0x40019bff, 0xc093af3b, 0x40436dbf, 0xbe4b7bbb, 0xc073a058, 0xc0b88e3e, 0x40d2e7e4, 0xbc680d57, 0xc00384fb, 0xbf43249a, 0xbf3cf727, 0xbfa16de7, 0xc0290ff1, 0x3f91d58b, 0xbf8d15db, 0x40837fcf, 0xc00cc3cb, 0xbfaeaa79, 0x4056bc43, 0x40ca7804, 0xc09baa0f, 0xc0374257, 0x40b23de3, 0xc06c152d, 0xbfbe4467, 0x4051ec54, 0x40ac3b7a, 0xc0909a3d, 0x3f45d0b1, 0x4036e038, 0x3f88e21b, 0xc0289666, 0x4088064c, 0x40d3919b, 0xbf9b1ab8, 0xbffa2ed5, 0x4002fd19, 0x3e2dd794, 0xbfbb9fdb, 0xc040571a, 0x3fe3b992, 0xbf17597a, 0x3fe9ba2e, 0x40b39701, 0xc1516bad, 0x408ccb6d, 0x412f3767, 0x409f28e7, 0x401b56f7, 0x4036a14e, 0xc0b3b647, 0xbffa9d99, 0x40cadf3f, 0xc064ad20, 0xc0bbf73f, 0xc0197ae7, 0xc0201632, 0xbe93ea83, 0x404454e3, 0xbf79cb98, 0x4086f3e3, 0xbe5104b1, 0xc02cb391, 0xc0414e20, 0x3e14ef34, 0xbfa6333d, 0x3fc56b1b, 0x3fa39da0, 0xc0283f1d, 0x3e3e4b7a, 0x406015a8, 0x3ffc62ac, 0x3eaf6c43, 0x3eedb60a, 0xbfd59572, 0xc044744c, 0x406b1d7c, 0xbef1d0d9, 0xc07faed5, 0xbfde12c0, 0xbe0371c1, 0xbf670f95, 0x3fd85e99, 0xbf2565ee, 0x3eceefb7, 0x3f4ad74c, 0x3d9c042b, 0x3fa63df2, 0x3e989b54, 0xbf86edf6, 0x3e05bbf6, 0x3faf7518, 0xbe9f754f, 0xbdec94c5, 0xbe5e52bb, 0x402dc632, 0xbff12345, 0x3e56f9c4, 0xbf3bc174, 0x3ff8f4f9, 0x401bf875, 0x4019e848, 0x40932f94, 0x3fe22927, 0x3ff9cccc, 0x400bb7b5, 0xbf136e1f, 0x4021d0ee, 0x40784ea6, 0x40abb18a, 0x3f974b6c, 0x4059abfe, 0x402b1762, 0x40548174, 0x405cbafd, 0xbfa95c89, 0x408da8b1, 0x3d1ad9e1, 0xbeab544b, 0xbf24b861, 0xbef6d589, 0xc05e86ef, 0xbe85e337, 0xbfe7cd4b, 0xbf309258, 0xc0307967, 0x3ecd7d68, 0x3fd7d60d, 0x402f05be, 0x405a7900, 0xc044e94c, 0xbe0692eb, 0xbf42c71d, 0xbe002bb8, 0xc007e3b6, 0xc03ac3a9, 0xc0a855ce, 0xc07b5b4c, 0xc0c42d9d, 0x4000f6c8, 0xc016ef69, 0xbf7c23d0, 0x401aa9a9, 0xbec27b93, 0xbffcdcf5, 0xc0852b48, 0xbfbb58cd, 0xc099905f, 0x402ec8b2, 0xbfd91fef, 0xbef4da5d, 0x3f50d6f7, 0x3faa8f8a, 0xbf96189c, 0xbed4647f, 0xbf138f64, 0xbfc13a31, 0x3f7fc632, 0xbff95908, 0x3c12abc8, 0xbe6d7864, 0xbad9b73f, 0xbe2dfa26, 0x3eba52b5, 0x3fc85e0b, 0x40072548, 0xc09fd5c1, 0xbe96880a, 0xc0296027, 0x3e7d8090, 0xc0993688, 0xbf355446, 0xbfbb0acd, 0xbfe91c4a, 0xbff8dd33, 0x3fcd3f01, 0x3d9dadc3, 0x3ef22435, 0xbda457c8, 0x3f772f25, 0x3ec798ec, 0x3f61369e, 0xc00af3a5, 0x3fb04728, 0x404cae82, 0xbecdd42d, 0x3f24a2b5, 0xbf8413af, 0xbf322864, 0xbffae456, 0xbfb96807, 0xbfb3f9db, 0xbfc62b3d, 0x4003a9b3, 0x3f4f17d4, 0x40ea4625, 0x4088dc1b, 0xc1151a60, 0x4101b594, 0x41a02aaa, 0xc07c24a3, 0xc0f15bfa, 0xc0d327a8, 0xc00055c2, 0xc10decb5, 0xc06a37a2, 0x4082ed71, 0xbc3f0d23, 0x405e2e83, 0xc090a742, 0xc0bd5ae2, 0xc05fa85a, 0x40c7ccf9, 0xc0e42c9e, 0xc17b65fd, 0x401e90e8, 0x409111e5, 0x407dd0f9, 0x400a7884, 0x40e9a4fd, 0x3f978ab8, 0x3e83f1c8, 0x3fd4c88e, 0xc04f7902, 0x408afe30, 0xc0081747, 0xbeffd2f4, 0x401c1ee6, 0xc0211a37, 0xc099201a, 0x3fca71ec, 0xbf73f625, 0xbf722009, 0xbf910ebd, 0x4047f66d, 0x405d0635, 0x3ed850ad, 0xbee73eb6, 0x3e9b74d2, 0xbfd426b8, 0x3f9367bc, 0xbedb2d09, 0xbfadc52e, 0x3fa5e9b1, 0x3fdad09d, 0x3f72e4c7, 0x3f4dfe36, 0xbe042e8d, 0x3dc33d50, 0xbfcc49e5, 0xbf81696c, 0xbfd80db4, 0xbe911555, 0x3fac5df9, 0xbfaea752, 0xbe91ed98, 0xbf788b0d, 0xbf0dcf99, 0xbf3d1d3f, 0xbf8f8599, 0x3fcbbe9b, 0x3f9c2301, 0x3eec4ce6, 0x3d8e510f, 0xbeca3bfa, 0xbf81b626, 0xc03b75f2, 0xbf99dd78, 0x3fa6f99c, 0xbf563f38, 0x402af5dc, 0x3f5757ae, 0xbfbe7684, 0x402652f7, 0x40d8b938, 0xbf144a67, 0xc01f9634, 0xbfad27f0, 0xbf8fa48d, 0xc014fa28, 0x3eba1a3d, 0x3f8d993a, 0x3dfdd127, 0x3fa64ed8, 0xc02237c7, 0x3fa93454, 0x3fcb1290, 0xbf8603e3, 0x3fc8f8ae, 0x4096ee59, 0xbff36687, 0xbfdfa325, 0x3e9829b7, 0x3e342287, 0xbf95a829, 0xbd7e8af5, 0x3fee7142, 0x3eb8ef60, 0xbe61adb6, 0x3f1d195b, 0xc10103e5, 0xc0584757, 0x411236c9, 0xc10b044b, 0xc1b125c1, 0x406f0a06, 0x4100ea57, 0x40c7db74, 0x3fcee879, 0x41181048, 0x40671410, 0xc053da67, 0xbec8896e, 0xc07a32c6, 0x4085286c, 0x3ee9aeca, 0x3f6abcf1, 0x3ed9bd3d, 0x3f3bcc12, 0x40205b1f, 0xbee565cc, 0xbedfb75b, 0xbeb7d4d6, 0xbf9846c5, 0xbf62afe2, 0x3ede6c34, 0xbffbc3c3, 0xbfaadc19, 0xbefaae6e, 0xbf869c2b, 0xc0c0f718, 0xc07a75ea, 0x4099e03e, 0xc0e227b2, 0xc1854311, 0x409d3722, 0x40d39dd4, 0x407d30e2, 0x402ef51f, 0x40c34970, 0x3e872ed8, 0xc06be630, 0x3e59b409, 0xbf9eb644, 0x407a294d, 0x3f4ad80c, 0x3f59d220, 0xc002358e, 0x3fb968a0, 0x3ffeac28, 0xbf53ad41, 0xbf105596, 0xbfc6ae93, 0x3d9a4754, 0xbfb76690, 0xbe737c17, 0x3e4671f7, 0xbead37d6, 0xbe8a2b1f, 0x3d86fd23, 0x3f3ae971, 0xbef71d46, 0x3d9732e4, 0x3f7636bd, 0x3f93308b, 0xbfbb7380, 0xbf62c3dd, 0xbd59f3c7, 0x3d9a53f9, 0xbcbdde13, 0x3ead0429, 0x3f31acd0, 0x3f8083ce, 0xbf4b5eac, 0x3f9ab242, 0x403409b3, 0x3f709601, 0xbfb34671, 0x400e1cb1, 0x40da72fd, 0xbffdbe22, 0xc0a62c83, 0xc027221b, 0xbf8d464f, 0xbfeedd87, 0x3e3e5960, 0x408914cd, 0x3fd1d28b, 0xbd418d78, 0xc0270184, 0x41138546, 0x408ec95b, 0xc1216008, 0x4126e023, 0x41bab8df, 0xc0915fb8, 0xc0c4a83e, 0xc091117f, 0xbf13c3c4, 0xc1385cfb, 0xc0aace3b, 0x400c55e2, 0xbea2bf8b, 0x40535ee9, 0xc087d4b9, 0xbe38b6a2, 0x4019cbbe, 0xbf0c37e7, 0xbfb26f7b, 0xbf4a0983, 0xbfc5a234, 0x3f24b809, 0xbf66ea6a, 0x3f5e7994, 0x3f29256b, 0x3e3e5707, 0xc024e64d, 0xbf600f22, 0x3fe764be, 0x3f4380cf, 0x3f91bbde, 0x3d3d2841, 0xbf2bded0, 0x3f0b6fb1, 0x3f0ce8f7, 0xbe7418c5, 0xbf9b1181, 0x3d9eda05, 0xbf9f1464, 0xbf536897, 0xbf05c8dd, 0xbf2c9958, 0x3f322fbb, 0x3f1f6619, 0xbecb2851, 0xbf8dbfe1, 0x3df0d6a9, 0xbe235b15, 0xbe9f8483, 0x3ec90b5c, 0x3f49956f, 0xbe5c3907, 0x3f05d1c6, 0xbea2315f, 0xbfcc63e7, 0x3f430c3a, 0xbf76edf9, 0x3f1dca41, 0x3ecbec30, 0x3f810105, 0xbfd8b2bc, 0xbf0b9501, 0x3f556973, 0xbe20b249, 0xbeb0e98c, 0x3f27f200, 0x3e2095f9, 0xbe16f1d8, 0x3f7883e6, 0x3f414449, 0x3f4114d2, 0xbeecfda1, 0x3ecdb5a4, 0x3f4a36ab, 0x3f95941f, 0x3d0a236b, 0x3d729598, 0x3bd82d2b, 0x3f24a7c1, 0x3ed9c0f4, 0xbe3cbc60, 0xbdcb4ba1, 0xbf06a707, 0x3f198c68, 0xbc5ed337, 0xbf1f2dac, 0x3f2f1afc, 0xbfc07ad2, 0xbf6c1411, 0x3d1d46e1, 0xbebf35b0, 0xbec4aab3, 0xbf23896b, 0x3f0c5b49, 0x3eb0e257, 0x3f083fa6, 0x3e4717c5, 0x3e76ed79, 0xbe990927, 0xbdc2134b, 0x3cfaf7e9, 0xbe823e90, 0xbe077af4, 0xbe9bd2f1, 0x3cba7dda, 0xbe6578f6, 0x3e07cbc9, 0xbf5f54b1, 0x3f8518e3, 0x3e9e2f7d, 0x3f13dee7, 0x3e2af9ba, 0x3bbcb6c1, 0x3f24782b, 0xbe5f1d1c, 0x3de90b8b, 0xbf98c057, 0x3f0acb0c, 0x3f166d4c, 0xbe3c6ac2, 0xbf150bdc, 0x3e25988d, 0x3f44ee42, 0xbd16c412, 0x3dc70131, 0x3ec9e874, 0xbefaa62b, 0xbf1a6d16, 0xbe309e3d, 0xbf107667, 0x3eba995b, 0xbf1395f0, 0xbf8ea66a, 0x3e6b065a, 0xbec40ddf, 0xbf48b8a8, 0xbead8ad6, 0xbf0e6f38, 0x3e42b89f, 0xbe99cd1b, 0xbcbc52a3, 0x3ee7801d, 0xbe8e3c73, 0x3ea1bc0a, 0xbefe372f, 0x3e8a651e, 0x3deeecdc, 0xbf448d1e, 0x3c6fd3cf, 0xbcc3b3b9, 0x3e763271, 0x3f33747c, 0x3e487159, 0x3ca117a0, 0x3d4ca5b1, 0xbf6e5cf9, 0x3dee9390, 0x3f0b8c3a, 0xbe24ac96, 0xbd705419, 0xbf0a278f, 0xbb602a46, 0x3efc5a5f, 0x3e55c731, 0xbeb42796, 0x3eb07671, 0xbebb432d, 0x3e39b476, 0x3e5dc792, 0x3c37f565, 0xbda4116a, 0x3ec9cb10, 0xbf3a266a, 0x3c92fba6, 0xbe775a8a, 0xbe4ee33a, 0x3f5f1c6c, 0x3ec2aae8, 0x3e36d527, 0xbeb16e84, 0x3e92495b, 0xbd266be2, 0x3f08f638, 0xbe85424c, 0x3f1c1da8, 0x3e7a5b46, 0xbdeaf22b, 0xbec2b746, 0x3eb82b40, 0xbdc62d3a, 0x3e0f8b9d, 0x3f6669e6, 0x3e4569a3, 0xbd056548, 0xbf12a37e, 0xbe088f70, 0xbe844239, 0xbd3f775d, 0x3f81d1f8, 0x3ed745bc, 0x3cde1cae, 0xbf42e12d, 0xbe7c32a5, 0xbf277a76, 0x3ed7b0e0, 0xbed29a93, 0xbe107811, 0xbde95d3a, 0x3cc75d52, 0xbf3f8aab, 0xbf2ab919, 0x3e037c0a, 0x3e3b9767, 0x3d2e7aeb, 0xbeda3c6a, 0x3e98627d, 0x3f0b4638, 0x3f199556, 0x3cf95cb8, 0xbd7a45c5, 0x3c70a43e, 0xbda3a193, 0x3ecd3837, 0x3e5b1769, 0x3da02c44, 0xbefb5d06, 0x3eab8370, 0x3eb84c32, 0x3d288be3, 0x3e264ea8, 0xbd1a4cb2, 0x3e8e24bf, 0xbd7dae8a, 0xbd33dd02, 0x3e212022, 0xbe89b414, 0x3e5dd1a4, 0x3eb64695, 0x3f1e33e7, 0x3e9eaff1, 0x3f5f76c3, 0xbf0d7a5b, 0xbf3ab76e, 0x3f8432a5, 0xbe695eb4, 0x3e3fc402, 0x3e56019e, 0x3f1c35e8, 0x3e37c4b8, 0x3e659843, 0xbe010aaf, 0x3cd4d763, 0xbf3286da, 0x3e9017ab, 0x3e4ada54, 0x3e5b00d9, 0x3d911e68, 0xbe9d2f51, 0x3d676960, 0xbe9cdcc6, 0xbeadaf6f, 0x3e341a72, 0x3e501644, 0xbe563a07, 0xbedc78f2, 0xbf3b9e52, 0xbf6b4f73, 0xbec5ece6, 0xbba28655, 0x3f1a15ab, 0x3d906cb4, 0x3ed807f5, 0x3f66e41d, 0xbd768a07, 0xbe1e8a71, 0x403d593c, 0xbe03e64f, 0x3d974a3d, 0xbea8902e, 0xbfb12982, 0xbfac0ab6, 0x3fe32056, 0xbe6afdc0, 0xbff4a911, 0x3e9f625c, 0x3f54d24a, 0xbde18902, 0xbf256aa7, 0xbe9e49b2, 0x3ede6cd4, 0xbef2004e, 0x3edf2fd6, 0xbddd96d4, 0xbe060c10, 0x3e5989df, 0xbe0c218d, 0xbf5b1660, 0x3f892edc, 0xbfd3ca72, 0x3f81c995, 0x3f54b2ed, 0xbf10855c, 0xbe2d8979, 0x3f4a73fc, 0xbd318fae, 0xbe2bfdf3, 0x3f0b1b14, 0xbdb928e4, 0xbec7f0cc, 0x3fc9833a, 0xbebd3d48, 0x3ed32df0, 0xbf61ba72, 0xc001aa0a, 0x3f54e23e, 0x3ecc4986, 0x3f63f49d, 0xbf8343bb, 0x3edfb664, 0xbeabe7cb, 0xbdc3cbab, 0xbf645b3e, 0x3fcad7f5, 0x3fcdda3b, 0x3fb9d5d4, 0xbed41e3a, 0x3e82f9d7, 0x3f59a461, 0xbea4d6fa, 0xbde328b5, 0xbfd9ffe7, 0x3f00e28f, 0x3e2aaf3d, 0x3f885955, 0xbf96f4a2, 0x3f1bdaad, 0x3ef992f4, 0xbe81ef78, 0x3fc1afc7, 0xbfb096c9, 0xbe90eef6, 0xbeaf5481, 0x3c762dfb, 0xc08ee1b8, 0xbfd969bf, 0xbf2e7c4b, 0x3e8bcdf4, 0x4074e17f, 0xbee40b71, 0xc0483090, 0xc00ae41f, 0x402b3ffe, 0xbfc617f3, 0xbf2c0b55, 0xbdd28e80, 0xbfddc61b, 0x3db37870, 0xbf6d5096, 0x3f9b5fbf, 0xbe0956d5, 0xc008c965, 0xbdb42db7, 0x3deec047, 0x3e1e7597, 0x3fca7733, 0xbfa7a90b, 0x3ecbd21c, 0xbe8e6aa6, 0x3fa8e37b, 0x3ee10fbb, 0xbfd1aef0, 0xbf6a3bc9, 0x3f5baa8f, 0x3f9756db, 0x3eca50e0, 0xbee05d0a, 0xbf8ee9f1, 0x3eec01f7, 0x3f23c248, 0xbe028cf4, 0xbf8389bd, 0xbfe73257, 0x3fb3f856, 0x3f1c7164, 0x3f8b6da2, 0xbf94a467, 0x3efaaf7a, 0x3e4cde49, 0xbde6e8a7, 0x3fb8644e, 0x3f126221, 0x3f066f72, 0x3f3b1208, 0xbf9ed955, 0xc00939d4, 0x3f0b7b0b, 0xbf6a7e96, 0xbee2f29b, 0x3fbdd8ba, 0xbdf7ea9a, 0xbf102e12, 0xbe80cf0a, 0x401a41b9, 0x3f83feca, 0xbf32b7f1, 0xbf96bfc6, 0x3fcc3813, 0xbf3a3b71, 0xbf7b9fe0, 0x3f9fc123, 0x3f1bf904, 0x3f97cf98, 0x3fe12b40, 0x3e93f310, 0x3f9b0899, 0x3ff18cdf, 0xbfebfe72, 0x3f93b643, 0xbf831bdb, 0x3f492da4, 0x3f8b6f37, 0xbf018f4d, 0xbf928d89, 0xbfa7808a, 0xbf36b07a, 0xc006578d, 0xbf5266de, 0x3f9ca483, 0x3f7250bb, 0xbf89e475, 0x3fbf70a1, 0x3c7f35ba, 0xbf4c819a, 0x3f5f840a, 0xbf1a5bae, 0xbd9b0e49, 0xbe8dbd11, 0xbd1f23a7, 0x3f260b2d, 0x3d418942, 0xbfb7b8dd, 0xbf7ed05a, 0xbf8b3917, 0xbfbd9968, 0x3e3e14d3, 0xbf528fe7, 0xbfd81b8a, 0xbee4c303, 0x3f01630c, 0x40064626, 0xbf28fdab, 0xbf7a2bc2, 0xbf929aee, 0x3ecd728f, 0xbfd2dac4, 0x3e6b1115, 0x3e7ba0bd, 0xc00b3657, 0x3e86fb44, 0x3f6d2e26, 0x4009ef73, 0xbf47e4a3, 0xbf1495f8, 0x401526c1, 0xbeee95db, 0x3e4e57e5, 0x3f90e97b, 0xbfa19428, 0x3fc2af71, 0xbf59fdb7, 0x3fcf5941, 0x3fec942e, 0xbf3d4147, 0xbfbb8191, 0x3f5cd4c1, 0xbe962951, 0x3f0eb13d, 0x3f144428, 0x3e75ac61, 0x3d935e4a, 0x3ff6efb4, 0xbf25ce03, 0x3fb329d8, 0x3ead788e, 0xbdb7facc, 0x3d9a69e7, 0x3f197dcb, 0x3f04f4fe, 0x3f9319ca, 0x3eb79440, 0x3e853666, 0x3fcd6f1a, 0x3f285578, 0x3f405eba, 0x3eff1378, 0x3e2e136e, 0xbf734583, 0x3f37282f, 0x3f1d6cb1, 0xbfaae987, 0xbfc3f07b, 0x3ef4be9e, 0xbf02d9f9, 0xbee1c255, 0x3df0f985, 0xbe9c83f8, 0xbe824f71, 0x3f0809c0, 0x3f1f48eb, 0x3f6c8596, 0xbf1e6087, 0x3f542176, 0x3f1944dc, 0x4039c3ee, 0x3e08e51e, 0x3f94b384, 0xbb9cc09e, 0xc0024a7b, 0xbef4452f, 0x3fe7248b, 0x3e662879, 0xbf9f4a45, 0x3ebbb5f6, 0xbe595af8, 0xbf4a7fee, 0x3f16399e, 0x3cca5fe7, 0x3f81e115, 0xbfac5d2f, 0xbf31ee2c, 0x3e7e0f08, 0xbf36598e, 0xbf8ff2dc, 0x3edb701b, 0x3da3c6ee, 0xbeae1067, 0x3f95617d, 0x3e415128, 0xbfc05ae4, 0xbe8ab25a, 0x3e854d68, 0x3f45315b, 0xbf60e9af, 0xbfbc1140, 0xbfbe0c42, 0xc082ea61, 0x3fc0dba9, 0x3feeb919, 0xc0348f4b, 0x3e38daec, 0x3f2998bd, 0xbf44565c, 0x401cca01, 0xbfb51f49, 0x3fcb35eb, 0xc03fd9b7, 0xc02c8079, 0x401d28ee, 0x4048d29f, 0xbf8506a0, 0x40ff1920, 0xbf914471, 0xc0c4ca95, 0x41ae3b3a, 0xc217a1f7, 0xc1e5f7e5, 0xc11d6d6c, 0xc1a1d258, 0xc167421f, 0x40ae2739, 0x41331f2e, 0xc18e1b53, 0xc0b15b4f, 0x413a3dbc, 0xbf8d8e6e, 0xc004dee7, 0x3f1a5d20, 0xc0de8192, 0x41b76806, 0xbf131b9b, 0xc12699fd, 0xc095424c, 0xc0e8e125, 0x411a5566, 0x41260812, 0xbf4749d8, 0x40a00f01, 0x41a8fec9, 0xc01b96e8, 0x400b054d, 0xc05ac11f, 0xc13d6896, 0xc08ccc9c, 0x3e2b1d09, 0x409fcfa9, 0xc1534a02, 0x41b39bd3, 0x419de973, 0x40b22c01, 0x41055b2a, 0x41380fa6, 0xc04abc67, 0xc0dc83bb, 0x4148b5f1, 0x404eacd7, 0xc0c383ed, 0x3f06c841, 0x3f0d8ea8, 0xbe9ec45c, 0x401f17e4, 0xc15a48bc, 0x4004b7ea, 0x410715a1, 0x4079cf67, 0x405fa6e8, 0xc0941747, 0xc06b1a0e, 0x3f006bab, 0xbfe14b1d, 0xc16321fb, 0xbdec6957, 0xc064c2b8, 0x40217682, 0x4100e5d2, 0xc05cc96b, 0xbf435dec, 0x4041a602, 0xc134a678, 0x41ab3653, 0x41731dae, 0x407b82c3, 0x40f6640a, 0x4126e6b2, 0xc0b4ee35, 0xc0951c2e, 0x4154622e, 0x408bfe14, 0xc0a65459, 0x3f54084e, 0xbea1c55b, 0x3e85a150, 0x3fdd4783, 0xc142df02, 0x3fd14297, 0x4115ee8e, 0x403111b4, 0x40985783, 0xc0a4a6c3, 0xc0addd22, 0x3edaaa5f, 0xc0528068, 0xc14e9ee7, 0x3f449b63, 0xbfd64138, 0x3f73b194, 0x410956df, 0x3fcb0932, 0x3f463efb, 0xbfe52747, 0x40c47a40, 0xc130d7ec, 0xc1079442, 0xc004c0af, 0xc03952c3, 0xc0afa30e, 0x40297e2b, 0x4024d0fc, 0xc0c6f447, 0xbfbf48a0, 0x4022447c, 0xbddc479f, 0x3eb7dfc9, 0x3f01420a, 0xbf08c491, 0x40ba9470, 0xbfb2c89e, 0xc0a432e5, 0xbfed5920, 0xc02c4955, 0x4017e0a3, 0x40219573, 0xbdde9059, 0x3fda22b7, 0x40d26f89, 0x3e6cd751, 0x3fe5b4af, 0xbfeded32, 0xc08a14d5, 0xc129db50, 0xbe389128, 0x40fd30bd, 0xc20207f0, 0x4263dc98, 0x42359f9b, 0x418027c0, 0x41c8f9c4, 0x41cd3574, 0xc1158a6b, 0xc1571363, 0x41f50734, 0x41127c5f, 0xc16f285c, 0x40862b16, 0x3ebc4ff4, 0xbe25ccfe, 0x40b492a2, 0xc1fd51ad, 0x403ce6ee, 0x41946d7e, 0x41108023, 0x4116569d, 0xc15352ad, 0xc1345341, 0xbfab9071, 0xc0f40d93, 0xc209f076, 0x3eaeec21, 0xc1146e88, 0x40c7bed6, 0x41af93a4, 0xbf6f6625, 0xbea18746, 0x3f1a7bcc, 0x3ea5a67b, 0xbffb248e, 0xbf338cec, 0xbf1c059f, 0x406a9a04, 0xbfd7d2d3, 0xbfc130ea, 0x3f7aff7f, 0x3e860e7b, 0x3f831594, 0xbf8fe0ba, 0x3f0cf55b, 0xbf541cc5, 0xbe81c6b0, 0x3f849056, 0xbf2b5752, 0xbf030361, 0x3e5f0b45, 0xbfe3ae98, 0x3cadf96a, 0xbfe5e07e, 0xbf962fa4, 0xbf89b594, 0xbf320ab6, 0x3f46bb51, 0x3e60511b, 0x3f22f958, 0xbf68104b, 0x3eee6119, 0x41307f74, 0x3e2843bf, 0xc115361a, 0x4201492e, 0xc268cfd0, 0xc2309807, 0xc151127d, 0xc1cb350f, 0xc1c49331, 0x411c3050, 0x416cf9cf, 0xc1ecf5f1, 0xc100911b, 0x4176402f, 0xc017e149, 0xbfbf4a01, 0x3f8c5e61, 0xc0f87c1a, 0x4203f5c3, 0xbffd89c2, 0xc19244b9, 0xc0d7e7d2, 0xc13e06f5, 0x415aaf71, 0x414ec0de, 0xbf705e75, 0x40dbe813, 0x42044f92, 0xc02319ee, 0x40baf7d9, 0xc06b137f, 0xc199d08f, 0xbfd46411, 0x3f3b538a, 0x3e9e6882, 0xc03eeb6f, 0x40d8e398, 0x40998f78, 0x4042f979, 0x400b3768, 0x40261c6c, 0x3f936780, 0xc00f3feb, 0x40430b7d, 0xbdc5be0e, 0xbf495752, 0x3f180d91, 0x3f83b729, 0x3f49c7b3, 0xba8d0381, 0xc0202385, 0xbda1901e, 0x3f7402c9, 0x40065d9b, 0xbef1f0d3, 0xbec459a1, 0xbef1664e, 0x3f0bbfee, 0xbfa20f61, 0xc05ba8e8, 0x3e907427, 0xbfe708f6, 0x3fa61873, 0x4012e415, 0xc0663aca, 0xbfbbd6d4, 0x404810b9, 0xc14e06d2, 0x41b973fa, 0x41910b9a, 0x40cd8063, 0x40d59a65, 0x411af4da, 0xc0357714, 0xc09d742e, 0x415ba8af, 0x3f7ec3f6, 0xc081cfa0, 0x3fca6e6e, 0x3f2670a2, 0xbf58d7ca, 0x3f87d773, 0xc13328d2, 0x401dc49b, 0x40f9da10, 0x40b25907, 0x40685a84, 0xc0907f32, 0xc03c554d, 0xbf3df8de, 0xc06fbd2f, 0xc15eb92f, 0xbedd802c, 0xc0a7bc31, 0x40564cd4, 0x411bb879, 0xbfdb5027, 0x3e6ad5d4, 0x403c3978, 0xc0fd22d7, 0x415b6116, 0x41338110, 0x40367de9, 0x4034be17, 0x40f7caaa, 0xc0572954, 0xc0214105, 0x410730e8, 0x403608c4, 0xc04fd2de, 0x3e382cb8, 0x3c7fa04e, 0x3e08b924, 0x3f29eb36, 0xc0f1b72b, 0x40035d8c, 0x40da25df, 0x40123dbc, 0x401914b0, 0xc02b440b, 0xc01dfb9e, 0x3eb2cf40, 0xbf5b1040, 0xc110c112, 0xbed276e4, 0xc00787c8, 0x3f805fd3, 0x40a6e2b8, 0xc084d919, 0x3d929d80, 0x40822d19, 0xc16011c6, 0x41c0151f, 0x419ec1d4, 0x40b8433e, 0x41282158, 0x41310bee, 0xc0a3070c, 0xc0b7c349, 0x4149ecd8, 0x40944f37, 0xc0ecce0a, 0x3fc77945, 0x3e48ab11, 0xbe6d88e8, 0x40266e3a, 0xc16352c6, 0x400d4279, 0x4113484f, 0x402fafe0, 0x409abd9d, 0xc0ada2a0, 0xc09b1111, 0x3d871d4d, 0xc008d008, 0xc1662dff, 0x3dfcde1c, 0xc05d6d4e, 0x3fbf3973, 0x40fd22fd, 0x40c0744c, 0xbfd35e29, 0xc0a626f5, 0x418750b0, 0xc1e9896b, 0xc1b703ca, 0xc0efbe54, 0xc1803138, 0xc138a8e2, 0x40abf1cf, 0x4105631c, 0xc1774b32, 0xc0c3c670, 0x4115992d, 0xbfbb182b, 0xbeeefe89, 0xbea7552a, 0xc0a15c59, 0x418f0ae7, 0xbec5b605, 0xc11d2333, 0xc0577672, 0xc0b02b1d, 0x40fd33f6, 0x41031d6f, 0xbf6194aa, 0x4080dda0, 0x41878376, 0xbff01fe1, 0x3fc7d395, 0xc005878a, 0xc11c309f, 0xc0f83975, 0x3f8bf98f, 0x40c0b84c, 0xc1ab9a43, 0x42157e1f, 0x41da29ca, 0x41109250, 0x41a5b898, 0x415f209d, 0xc0c6146a, 0xc12a8fb9, 0x418b2dc4, 0x40d98714, 0xc13085a6, 0x3fddfaa1, 0x3f85def5, 0xbce5ccc3, 0x40e32f32, 0xc1bccc7e, 0x3e8254da, 0x412619f5, 0x4060317f, 0x40e8e73d, 0xc121ceb4, 0xc12a4748, 0x3f9322ef, 0xc09d01e9, 0xc1a2bfd7, 0x4029eb9a, 0xc012f378, 0x3fda43eb, 0x4135707e, 0xbf4e238d, 0xbedab33b, 0x402a1827, 0xc0eb0f74, 0x41360312, 0x412047e1, 0x3f8a696e, 0x3fcb3e23, 0x40d6f539, 0xc0812ed0, 0xbfc23eb6, 0x4108000b, 0x3fb59566, 0xc034a98b, 0x3f48bba8, 0x3d9d7e73, 0xbf008542, 0x3d846a5e, 0xc0af90a8, 0x404b39e1, 0x40e98639, 0x402263f7, 0x4030e403, 0xc0159e54, 0xbf51767a, 0xbeb2f365, 0x3e16247d, 0xc1033e78, 0xbf747545, 0xc02b0e9d, 0x3f00272e, 0x4096038b, 0xc0567ad1, 0x3ea196f1, 0x403f32f3, 0xc12f55b2, 0x4192da32, 0x416d1264, 0x40b161af, 0x4106ed33, 0x40e6cdd1, 0xbfdf4ce5, 0xc0a5aaef, 0x4108536b, 0x3f59fedd, 0xc0921e03, 0x3ee6e5f2, 0x3fcae4ed, 0xbfa0153d, 0x406c9d58, 0xc12154a2, 0x3f2d23ed, 0x40519117, 0x402e053c, 0x40594b50, 0xc083533f, 0xc03077ba, 0xbe6f233a, 0xbffb9082, 0xc1258c57, 0x3f1db383, 0xc031892f, 0x3fcddbc8, 0x40c63d22, 0xc0b6cd4b, 0x3f3882f0, 0x40d1f170, 0xc1a2aa10, 0x42107bb1, 0x41e78b5d, 0x41080569, 0x4175ecf6, 0x416b7bbf, 0xc0ac53f7, 0xc10ea5ac, 0x41965c3a, 0x409643a2, 0xc1245c4d, 0x3fcb9005, 0x3fb84208, 0xbec94e66, 0x409f5749, 0xc19970d7, 0x403470ac, 0x41442a96, 0x40ca99be, 0x40dc90d5, 0xc1070221, 0xc1048f73, 0xbe0a6494, 0xc088ee13, 0xc1ab23f7, 0x3e96a0a8, 0xc0996790, 0x407ed48a, 0x4145e9a0, 0x3fa68aea, 0x3f89c962, 0xc0169a04, 0x40fc4d0f, 0xc1558b7e, 0xc14a2a48, 0xbffe2427, 0xbfed5adc, 0xc121abf2, 0x409ce3e9, 0x3fecdf17, 0xc128617a, 0xc0362894, 0x40362c9a, 0xbfeadb55, 0x3f838f78, 0xbf16143f, 0x3f069b96, 0x4102aeeb, 0xc04e0e52, 0xc1152431, 0xc02b0506, 0xc017d07a, 0x4014cec2, 0x3f149010, 0x3f2fbe7d, 0x3e1141dd, 0x411a9147, 0x3fc13e21, 0x4079f56d, 0xbf21b888, 0xc0c40ce0, 0xbfba456b, 0xbee9fab5, 0xbfb3730e, 0xbfa156a6, 0x40b0209d, 0x401e89fd, 0x4029a7b4, 0x3facec1f, 0x3ffdf8da, 0x3fb5213f, 0xbea8f405, 0x400099f8, 0x3f27a27c, 0x3eda05dd, 0x3f0d7acc, 0x3ecc5ce1, 0x3f23efb1, 0xbf976817, 0xc0113437, 0xbfab9696, 0xbe850b34, 0x3f0f34fe, 0xbd3a28ac, 0xbe80ad82, 0xbf84f9b1, 0x3f445a9e, 0xbfed0731, 0xc012174f, 0x3f77996f, 0xbff2f86e, 0x3f905d51, 0x4008d702, 0x40c0a717, 0xbd2bcfe4, 0xc0ad2c39, 0x4194c3fc, 0xc1f5e266, 0xc1c68a6e, 0xc10ae30e, 0xc15835fe, 0xc14a47be, 0x407a8dc9, 0x40fa6fcb, 0xc17d79ce, 0xc0965acb, 0x410c8131, 0xbfd6b8eb, 0xbfa9574b, 0x3e8c0aba, 0xc0567cc9, 0x418d807a, 0xc0129143, 0xc11deed4, 0xc0bce49d, 0xc0a0530d, 0x40dc1b99, 0x40a2c9ec, 0xbe12f327, 0x4073d377, 0x419323b8, 0x3d9ca4ac, 0x40a83eda, 0xc06c21a3, 0xc12f86ad, 0xc01b2680, 0x3fa50c2a, 0x40154e6e, 0xc0b718c8, 0x40fcd290, 0x40c6b54b, 0x4006425c, 0x40f46941, 0x3fa8b38b, 0xbf224ab2, 0xc079993b, 0x402d588f, 0x3ffdc74a, 0xc0808455, 0x3d05c6cb, 0x3fd3f7c2, 0xbd44bd2e, 0x4057c4a3, 0xc0dcf4be, 0xbd812e1b, 0x3f1b040e, 0x3f2b02a5, 0x402373c6, 0xc041e527, 0xc0677033, 0x3f5f600e, 0xbfd014fa, 0xc0829706, 0x400cbe56, 0x3fec516d, 0x3f456e64, 0x3fb2557a, 0xc1068cb3, 0x3fc4ae0b, 0x40c4c711, 0xc1cf544f, 0x42379f1b, 0x420d5fef, 0x414b16fb, 0x419b5fba, 0x41941e92, 0xc0a51d83, 0xc1560b7e, 0x41ad2099, 0x409665e0, 0xc142038d, 0x4015f466, 0x402489ee, 0xbee025a7, 0x40bfc851, 0xc1bfe2ac, 0x3fb64fef, 0x41484609, 0x40e93142, 0x40ff2f2e, 0xc1123f99, 0xc102941a, 0x3f722f09, 0xc09d5179, 0xc1cdea9e, 0x3f83ad7d, 0xc0ce1c85, 0x40950081, 0x4162801b, 0xc04e6493, 0xbfdba980, 0x4030df65, 0xc139ee39, 0x41a2e217, 0x418a1935, 0x408e4529, 0x40c90404, 0x412be713, 0xc09f9966, 0xc090fd45, 0x41556c6c, 0x40560f1a, 0xc08c94b7, 0x3f9bb522, 0xbfa61c86, 0xbed3053c, 0x3c866cdf, 0xc12fe205, 0x4013a58f, 0x4128a583, 0x40277a4e, 0x404e713f, 0xc0970edd, 0xc0464e8e, 0xbf882ddd, 0xc01d686b, 0xc149a817, 0xbf3491f4, 0xc08050d6, 0x3ffb7a44, 0x410c0b5c, 0x3f0ca6f9, 0xbdd266c4, 0xbd0c00c3, 0x3f91be29, 0xc06b23dc, 0xbfb4ccce, 0xbe78efa3, 0xbfb20ecd, 0xbf82bbbb, 0x3ee6821f, 0x3f75d1ae, 0xc00440a3, 0xbf951a25, 0x3eb84677, 0xbf3bed6b, 0x3f16576e, 0xbf2ee04e, 0x3effdd38, 0x3f756ccf, 0x3d991d76, 0xbf4793c6, 0xbf2d488c, 0xbf41c632, 0x3ef01d04, 0x3f7a9fd0, 0x3d92326c, 0x3f5bbc3b, 0x3fa57056, 0xbf779670, 0x3eece346, 0xbec13dd2, 0xbf95f458, 0xc0a887cb, 0xbfa7d13e, 0x3fd9c469, 0xc14a7bbd, 0x41c7d515, 0x4180bd98, 0x40bf8e4b, 0x4141f02b, 0x4123c82a, 0xc0777634, 0xc0a852ba, 0x414274ad, 0x405a54ef, 0xc0ba702a, 0x3fb7a19c, 0x3df1fbfb, 0x3bd1fbc2, 0x403a16c8, 0xc168627f, 0xbe15ecf0, 0x40bb82a4, 0x4026581a, 0x40b63efe, 0xc0b4cbe7, 0xc0d62843, 0x3ef1c5b1, 0xc0874c95, 0xc14ec340, 0x3fd42cac, 0xc0423259, 0x3fcc95b7, 0x410c7703, 0xc076d5f8, 0xbf8fbc91, 0x404b414b, 0xc13b26a7, 0x419b3cc0, 0x41860894, 0x40bfcbcc, 0x41064f31, 0x4117b8f3, 0xc08e0abc, 0xc045aa36, 0x4152aa43, 0x409ac28e, 0xc0ab5eb4, 0x40244c51, 0xbfc452cc, 0x3ece40af, 0x3e219487, 0xc134c75b, 0x3fde475e, 0x4110674e, 0x4031a824, 0x403789be, 0xc0995d75, 0xc03b7f5c, 0xbff579af, 0xc0277e93, 0xc149eb40, 0xbf9d60fd, 0xc0a3d1d2, 0x40000903, 0x4110811f, 0x403819a8, 0x3ff07aa7, 0xbea0bf1b, 0x40d4ef02, 0xc1592ce7, 0xc1197738, 0xc082e82b, 0xc0c7d6fd, 0xc0c18d45, 0x4052118e, 0x3fddc897, 0xc116a5ca, 0xc069c17d, 0x40185a26, 0xbfe5f4b5, 0x40092e25, 0xbe68f7c6, 0x3fa2355f, 0x40e90fa0, 0xbe9c3c57, 0xc0b738f1, 0xbf62c983, 0xc005cd19, 0x40607f85, 0x4069c87c, 0x3fb6b882, 0x40584127, 0x410413f2, 0xbee11385, 0x4058fbcb, 0xbfb5ac45, 0xc0e9ea4f, 0x40f776e6, 0x3f0f8e3c, 0xc0e383c8, 0x41d0a372, 0xc23d0d4d, 0xc210d4f4, 0xc1320d89, 0xc18e4ca3, 0xc1a572fb, 0x40e29364, 0x4127609b, 0xc1d0b246, 0xc0cdeab9, 0x41294238, 0xc00f6ce7, 0xbfd48bbb, 0x3f477828, 0xc0806d31, 0x41d48a8d, 0xc05240a1, 0xc17d1ccd, 0xc0d4cbd4, 0xc10b4bc2, 0x4129420d, 0x410e50b3, 0xbf393217, 0x40c0a267, 0x41dc7e1d, 0xbf8b1ac6, 0x40ec25a0, 0xc05cde80, 0xc18b4557, 0x409be8c0, 0xbec920f9, 0xc0287fe3, 0x41825aca, 0xc1e5df42, 0xc1b285d8, 0xc0f99c1c, 0xc127f8c9, 0xc1691f33, 0x4059cb4c, 0x40ca358c, 0xc1756376, 0xc084459a, 0x40d788fb, 0xc0311317, 0xbfb45085, 0xbfa7f1d5, 0xbfd93c71, 0x41781645, 0xbfa95e74, 0xc1124ad9, 0xc09553c8, 0xc08aaef9, 0x4099387f, 0x406d7a22, 0xbf4a62c4, 0x4056cc25, 0x418548c7, 0xbf00cb60, 0x40b5e1db, 0xc0099ebc, 0xc1237c2d, 0x407d7c2b, 0x3ee56f7e, 0xc09de33c, 0x416df187, 0xc1c666c2, 0xc19f5df7, 0xc0ae7a48, 0xc11f1d03, 0xc12309a8, 0x4090e313, 0x40b01c3d, 0xc14e22cc, 0xc058be7a, 0x40e295b3, 0xbebab12a, 0xbfab0493, 0x3f44c41f, 0xc0566edc, 0x4162b1f2, 0xc040528c, 0xc10b3eb1, 0xc063e92b, 0xc0a7dd6f, 0x40cc6674, 0x409b8354, 0xbea35439, 0x40233c31, 0x41705a57, 0x3e13fedc, 0x406f1ca0, 0xbf959850, 0xc10cd291, 0x4081043a, 0xbf2558ac, 0xc079f832, 0x414eca83, 0xc1a4a75a, 0xc190ffde, 0xc0dfea57, 0xc12ff03a, 0xc116d485, 0x405577bb, 0x40aa145d, 0xc142d419, 0xc0863266, 0x40c81648, 0xc02f52ca, 0xbf1ab9b4, 0x3e1c50c2, 0xc045a894, 0x414b2172, 0xbfdf44e7, 0xc0e281db, 0xc06ecda0, 0xc02be109, 0x40a9590f, 0x4072e51d, 0x3fc1459e, 0x400e01f6, 0x41519116, 0x3f4b1adb, 0x40898344, 0xc030c2d7, 0xc106e040, 0x4116bc91, 0xbf69c3a2, 0xc0d7f242, 0x41c29153, 0xc2323714, 0xc2094ef6, 0xc15bf4bc, 0xc1b46327, 0xc1765038, 0x409f3224, 0x41507d64, 0xc1b3d902, 0xc08c3908, 0x41426388, 0xbfe9258b, 0xbfec35a0, 0x3edb1b31, 0xc0d81d59, 0x41be3f6d, 0xbf7d3fd2, 0xc138c1cd, 0xc0f91062, 0xc0dee092, 0x412a4236, 0x4128a210, 0x3eda08ef, 0x40de9c2f, 0x41cab837, 0xbfb74c09, 0x40a5196a, 0xc0b82bbd, 0xc175b83c, 0x4043d475, 0x3f9ee70a, 0xc03c5354, 0x4127d555, 0xc1875558, 0xc16544ef, 0xc086d7e2, 0xc0bb3208, 0xc1118d93, 0x4097918b, 0x40427758, 0xc12cfd10, 0xc01a901c, 0x408da90e, 0xbf7b9bc4, 0x3f53702f, 0x3f748732, 0xbf75c1e5, 0x41139f75, 0xc021b237, 0xc0f18f36, 0xc023d59d, 0xc06b5066, 0x4082d7f6, 0x403ad4c2, 0x3fb6952f, 0x400474ac, 0x41347efb, 0x3f6ef050, 0x40654648, 0xbfd360f3, 0xc0f66072, 0xbfbafb0c, 0x3f53b394, 0xbffada05, 0xc0375233, 0xc000fcec, 0xbf37055b, 0x3fa3869d, 0x3f9c2e3a, 0xbfeba4fc, 0x3f0ccd48, 0xbebc4585, 0xbf493c48, 0x3ff08ea2, 0xbec14b34, 0xbe65e5c1, 0xbf2e4a2b, 0xc02ef315, 0x3fd5aec4, 0xbee83ba9, 0x3f4801c8, 0x3df4d4f2, 0x3f5c0e6e, 0x3f43b9c5, 0x3e0eeef0, 0xbf244900, 0xbfbbd9d4, 0x3ec1cd60, 0x3ff6c5a9, 0x3f76e978, 0xbea13254, 0xbfff8897, 0xbe9db42b, 0xbe9382e1, 0x409f1436, 0xc0a7879c, 0x40a25b1f, 0x4137f566, 0xbfae4d34, 0x4097337b, 0xc01052fc, 0x3e9226b0, 0x3ec659c5, 0xc01fc42e, 0x3f22974d, 0x3dca3d96, 0xc0d994ce, 0x408056ca, 0x3f1167d2, 0xbc69c024, 0x40349c66, 0xc0ee030c, 0xc02b9418, 0x40697280, 0x3e490ccf, 0xc014e083, 0x3e1cf54d, 0xbecc6ca8, 0x409f22a2, 0x40207a4c, 0x405a8ceb, 0xc01ddbd2, 0xbfb0e705, 0x3f9ed5a4, 0x4014262b, 0xbedb76c6, 0xbfcdba11, 0xbf1b3720, 0x400e4fee, 0xbf3da176, 0xc0a037dd, 0x3fdaec3c, 0xbff8b469, 0x3feadbf3, 0x3f68443a, 0x3fb2db77, 0x3eef36ce, 0xbf8dd949, 0x3fd3566d, 0x3f90a141, 0xc0194d60, 0x3ec0363f, 0x3f8b6e5a, 0xbfaad7c2, 0x404cefc5, 0x400720b9, 0xbff9dc7f, 0x3fa6fd95, 0x3e90b4b2, 0xbe4d9151, 0x4014488e, 0xc00d2049, 0xbede2ebd, 0xbfdf6e97, 0xbf8c7cef, 0xbf3f389a, 0xbf8d140c, 0xbe150366, 0xbeb6510a, 0x3fec8d96, 0xc0af3d0d, 0x40fbff29, 0xc0d5c2ad, 0xc1691af6, 0x3fb9d480, 0xc1098592, 0x40ac1e46, 0x3e33e07a, 0xbf2bcf9b, 0x404e40ee, 0xbf2eca82, 0xbef8d190, 0x41390fa8, 0xc075c514, 0xbf9a2cdc, 0xbf1ef39e, 0xc08a0db0, 0x412626c5, 0x403655f8, 0xc07c4fff, 0xbfdbbddb, 0x40275715, 0x3d9d14a1, 0x401a598c, 0xc0d385e2, 0xc0844d68, 0xc061b642, 0x405aa51a, 0x4004ad17, 0xc04beed7, 0xc05ca321, 0xbf837934, 0x404c8470, 0x4044a963, 0xbff8e9ce, 0x4010d514, 0x408bad86, 0xbf64d97d, 0x4003659e, 0xbeed7272, 0xbfd95393, 0x4049780e, 0xbf9fcc81, 0x3f670ec2, 0x3fd9d062, 0xc07a0f33, 0x4003ae18, 0xbe473cdc, 0x3e900946, 0x4022a4d7, 0xc0763cb2, 0xc01333b5, 0x403a28a8, 0xbf74a18f, 0xc034b0e3, 0x3e98aaf1, 0xbff496d0, 0x40018c6a, 0x3fabe1f1, 0x3fdb1cbd, 0xc04d9be9, 0xc00d57f0, 0x3e548328, 0x400dd94d, 0x3f3c9a90, 0xbf8bed95, 0x400b3e32, 0xc0642263, 0x4050453d, 0x4120f4ca, 0xbfcdeab6, 0x402906a8, 0xbfda3bba, 0xbf72d96b, 0xc005f4fa, 0xc04ecabd, 0x3f9580cf, 0xbfdcd43d, 0xc01f11d3, 0x40818e1b, 0x3f4aec97, 0xbfb3bbc5, 0x4005de2d, 0xc0c69f49, 0xc0766668, 0x4062cf81, 0xc006d292, 0xbfc2f0c7, 0x3f123378, 0xbfce9202, 0x4067d7f5, 0x3f8f798b, 0x405bea0f, 0xbeb3d14d, 0xbf00c5c0, 0x3f984c7b, 0x3fc5ede8, 0xbf407355, 0xc01487a7, 0xc004829d, 0x3fe88b74, 0xc0358b1e, 0xc00bc1c4, 0xbf3cc7c5, 0xc0b3923e, 0x4052d47e, 0xbe1e2145, 0xc0391b61, 0x3fc2a41c, 0xbedf5f62, 0xbe0df1bc, 0x40ad17eb, 0xbf4f8b16, 0xbf546428, 0xbf94a69b, 0xbfcf0e47, 0x4029adaf, 0x3f2dd9ee, 0xbfb2cb88, 0xc0171ee6, 0x3f73d928, 0x3e0fcbc5, 0x3e9ed3e2, 0xc032c987, 0xbfc2daaf, 0x3e31acc9, 0x4013b67e, 0x3f94462e, 0xc0058b8a, 0xc02f37d5, 0xbe695e97, 0xbf10a6c3, 0x3fa323b5, 0xbf8f13de, 0x402b006a, 0x4043307a, 0xbeef7d97, 0x3f8e29f4, 0xbfa25c4f, 0x3f806d71, 0xbe9284e8, 0xbfe3c816, 0xbe98b80a, 0xbe443af9, 0xc029f99f, 0x3eea673f, 0x3e8ff535, 0xbe981c65, 0x3f13bc94, 0xbffad588, 0xbf27ca83, 0x3feccb0b, 0x3e7226c1, 0xbfe86efb, 0x3d0aaa17, 0x3d8f7b97, 0x4002eb3d, 0x3ec0a083, 0x3fa18c20, 0xbfeeea15, 0xbfd7d6c6, 0x3f9e05aa, 0x3f00811d, 0xbe5782b5, 0xbf7247e0, 0x3f8987f0, 0xc03db4a3, 0x401a0341, 0x4097f3fe, 0xbf904b61, 0x4057ed2d, 0xbf88896e, 0x3f72871b, 0xbfb8be5d, 0xbfe1c2e6, 0xbec85e0a, 0xbf57b0c0, 0xc01f8fef, 0x3fda224c, 0x3ea6986c, 0xbe56fffb, 0x3f211414, 0xc02d9046, 0xbfef0d27, 0x3f9a1108, 0x3f7b7b2c, 0xbeb2e566, 0xbf3435b2, 0x3ecdafd6, 0x401d72ef, 0xbe7092da, 0x3f35b45e, 0x3eda1069, 0x3d0d6709, 0x4017e40d, 0x3f431cba, 0xbfafe9ce, 0xbeda90db, 0x4073e89a, 0xc0bc9d4b, 0x4084c127, 0x4122d1b6, 0xbfe7a28a, 0x40c8d0fe, 0xbff20b7a, 0xbe22fd3e, 0x3fbbf595, 0xbfea8bd5, 0x3e591d10, 0xbe35079b, 0xc0f111cb, 0x4053fc57, 0x3f57d2e5, 0x3f9846bb, 0x401f9baf, 0xc0e2175a, 0xc02c58b6, 0x4081135a, 0x3f838354, 0xc0184148, 0x3e1cf437, 0xbfafebd7, 0x408ddcc4, 0x40442e22, 0x4060b476, 0xbfc1a867, 0xbf807a7f, 0x3f83373f, 0x4018aae3, 0x3f25ffd7, 0xbfd00910, 0x3fbae328, 0xc01e9816, 0x3f761b3d, 0x40572b9c, 0xbf891556, 0x401e6125, 0xbf8db135, 0xbe0deef3, 0xbf6c701d, 0x3ed22568, 0x3e9d775b, 0xbf213254, 0xbfc59dcb, 0x3f8e8031, 0x3f002a5e, 0x3e452486, 0x3f163884, 0xc002fad1, 0xbe94a7a7, 0xbeed09da, 0x3fe9e1f5, 0x3f8aa3e7, 0xbe110522, 0xbcf6b45b, 0x3fd2a15a, 0x4017956f, 0xbdb5316d, 0x3f88abfb, 0x3fb57b98, 0x3f1e80cc, 0xbeb8eb5b, 0x3f5e7755, 0xbf80697f, 0xbf76d603, 0xbcde366d, 0x3fb6f73c, 0x3f43814e, 0x3f79e51b, 0x400d6ae4, 0xbfefcf58, 0xbf4cc15d, 0x3fad428a, 0xbf0d8c9e, 0xbe949923, 0xbe220b8e, 0xbfc95362, 0xbf57330f, 0x3f92c954, 0x3efe0d62, 0x3f620856, 0xbf834471, 0x3f6a448a, 0x3c0411e6, 0x3ff2d0b3, 0xbeb89c00, 0xbeed34e9, 0x3f43825e, 0x3f82094e, 0x3f29941c, 0xbfe7685b, 0xbfe98786, 0x3d9d3f38, 0x3faeb939, 0x3f80f086, 0x3efed3af, 0x3f36a91f, 0x408012cd, 0xbf567359, 0x408f0e6c, 0x405a8751, 0x3fc3ef75, 0x40279083, 0xbe2ff349, 0x3ee5ee20, 0x4085bb65, 0xc0071f08, 0xbe6226b3, 0x405ef93b, 0xc0ab769f, 0x3d348426, 0x3f2af99b, 0x3ee3ca79, 0x4021f2d4, 0xbfebcd7a, 0xbd842957, 0x3fa56edc, 0x3e0fa1a1, 0xbfa7b581, 0x3bbfde03, 0x3f972f78, 0x3fdb3c6c, 0x4020973b, 0xbd40d672, 0xc0914800, 0xc01ec760, 0x3fbc7031, 0x4054c6af, 0xbef4f5d4, 0x3f3323b7, 0xc050f51e, 0x409ce82c, 0xc0ab3566, 0xc13ec182, 0x3fe89686, 0xc0a56e6a, 0x40309783, 0x3f99ebdd, 0x3f304408, 0x40428438, 0x3e2bc95d, 0x3ee5fd0a, 0x40a7e851, 0xc068ddbe, 0xbf9662e9, 0x3fa700b2, 0xc0494423, 0x40eb70ed, 0x40396a52, 0xc08d26ea, 0xbced3de9, 0x3f854b62, 0x3cd09cc2, 0x3eecab26, 0xc098035c, 0xc034aca9, 0xbfb551db, 0x404af6e5, 0x3fcd9ec1, 0xbff2aa1b, 0xbfd43932, 0x3e197bdd, 0x4023216c, 0x3fba88f9, 0xbff114c6, 0x3fb624ca, 0x40215b72, 0x3efe235a, 0x400cb666, 0xc0016040, 0x3edcd2bf, 0x400a798c, 0x3f042225, 0x3f2ba72e, 0x3ed09c5e, 0xc04b055e, 0xbcef8720, 0x3e9a410a, 0x3f955d27, 0x3f715ccf, 0xc0054a07, 0xbe6cf70b, 0x3cc37d82, 0x3dc4af64, 0xbf0a6ba0, 0xbeae3385, 0xbfb23e4d, 0x3f49ee01, 0x400f3b83, 0x3f4ee622, 0xbf9b64ba, 0x3ed1ed3e, 0xbf072ec0, 0x3f63fc5b, 0x3f9beb8d, 0xbeca9caf, 0xc04b5f45, 0x3ecf93d5, 0xbfd4dced, 0xbff1dc33, 0xbf79762f, 0xc020acab, 0x3ebd2b92, 0xbf829928, 0xbfbc80cb, 0x3f0df1f5, 0xbeecf6b7, 0xbf0de591, 0x4014b139, 0xbf2bac1c, 0x3eaa9143, 0xbe9927a7, 0xbf1d9873, 0x3ee8930e, 0x3eebdcf2, 0x3ca6ff0f, 0xbf9f041d, 0xbf3a1ce2, 0xbefa967e, 0xbf1b23b8, 0xbf507cee, 0xbfa90198, 0xbed3b091, 0x3f934578, 0x3e970dbf, 0xbe353a3c, 0xbfc5b96f, 0x3eb6be8f, 0xbf036ac5, 0x408a52d7, 0xc0bca98d, 0x4092f44c, 0x41144958, 0xbf76cb32, 0x40ede5c2, 0xc02e4098, 0x3f4d1db4, 0x403738b9, 0xc02bfd8f, 0x3f01d425, 0xbf04a4d2, 0xc110de3e, 0x402d3a19, 0x3f072ade, 0x3fe03ed4, 0x4000205c, 0xc0e7c077, 0xc031344c, 0x404e4cf3, 0x4000ae5c, 0xc03cc645, 0x3ecfa31d, 0xbf58d58c, 0x40a58389, 0x40462744, 0x40935ac3, 0xbf8319c4, 0xbf841d69, 0x3fc2ad1f, 0x40448d38, 0x3e3b5399, 0xbfd2e1ab, 0x3e61d832, 0xbf5f8871, 0x3fba1c71, 0x409a12da, 0xbfa8ec59, 0x3ea40f60, 0xbf718926, 0xbf5bdfb7, 0xbfc5ce2f, 0xbf967100, 0x3eab53ab, 0xbe98f8d0, 0xbf492f31, 0x402479c9, 0x3f4d2ab4, 0xbf828cd8, 0x3f346792, 0xc0599154, 0xbfc28a89, 0x40071c1f, 0xc0249a6b, 0xbfab2979, 0xbe55a2f4, 0xbf5411ce, 0x3fb2dca8, 0x3eea0334, 0x3fa0a428, 0xbf16ad52, 0xbed0f60f, 0x3e06b6c0, 0x3f12324a, 0xbef69897, 0xbf346f32, 0xc038ed23, 0x408f535e, 0xc09151ea, 0xc11bf585, 0x3f80eb21, 0xc0998398, 0x403571c1, 0x3ced5f52, 0xbe28c7dc, 0x40437e47, 0x3e54d22e, 0xbe1ad3ab, 0x40bc3ae3, 0xc03627df, 0xbfa672f4, 0x3e052f75, 0xbffc7007, 0x40d91957, 0x40162746, 0xc06fe8d7, 0x3ea413a8, 0x40151567, 0x3e400e54, 0x3ea5fa5f, 0xc08aeefc, 0xc00310b8, 0xc0114fa9, 0x402d695b, 0x3fe0fce5, 0xc007b142, 0xc004e3f5, 0x3f06d618, 0x3fc14f79, 0xc0ba5b81, 0x40ce5700, 0xc1073cd0, 0xc1851936, 0x3fd6c52a, 0xc0ad93bb, 0x3ff49068, 0xbf09e08a, 0xbeccd900, 0x408fb92c, 0xbcae6ded, 0xbf13911b, 0x41088b08, 0xc0aa9ab8, 0xbf812044, 0x3f0c2da9, 0xc06e7094, 0x411c6e9b, 0x4082fb14, 0xc0ae5644, 0x3fe6e513, 0x4089d604, 0xbe9be47c, 0x3e8fbc32, 0xc0c6f920, 0xc05ea096, 0xc0ad4d2e, 0x4080c85f, 0x4025128f, 0xbfb75f17, 0xc04120f0, 0x3fc2daaa, 0x4003c391, 0xbfd73ce1, 0x409be517, 0xc08e4fdd, 0xc115ecf7, 0x3fc6dbff, 0xc0a507a3, 0x3ff9d02d, 0x3e2f2377, 0xc00d1557, 0x404205f4, 0x3f5494f3, 0xbc36f398, 0x40df4068, 0xc008514c, 0xbf9851ad, 0xbfb8bdc8, 0xc024fe14, 0x40e6fc23, 0x3fbe280f, 0xc07eb391, 0xbfcf975b, 0x4046d2f9, 0x3e3ec4fa, 0x3f446655, 0xc09a4299, 0xbfff63e8, 0xc01dc043, 0x4016d537, 0x3fcb007e, 0xc00d731a, 0xc020fc67, 0xbe932e3b, 0x400141d6, 0xc039dfc7, 0x4065ec91, 0xc0c1f5d8, 0xc1209334, 0xbf4394ff, 0xc0af9c45, 0x4086b519, 0x3f266661, 0xbf992eaf, 0x40267dda, 0x3e128569, 0x3e4bc258, 0x40ca0716, 0xc02b5a63, 0xc00140c3, 0x3f404248, 0xc08d0fcc, 0x40db8059, 0x3f9b6b2e, 0xc03398b8, 0xbec6d42f, 0x3fdacdd0, 0x3e89b675, 0x3e49783c, 0xc09eb770, 0xc0032406, 0xbf442e3e, 0x40723440, 0x40167bcc, 0xc0507770, 0xc06e7312, 0x3ec63c49, 0x3f20ab22, 0xc0358b32, 0x40ce6c14, 0xc03b7593, 0xc1211ef2, 0x40165db3, 0xc0a8acd8, 0x403dcee8, 0x3fb7d53f, 0x3f00b7ca, 0x3fb724fe, 0xbf8f16ae, 0x3f994888, 0x40d07831, 0xc0512fc1, 0xbddeefeb, 0xbf6f3c68, 0xc06219fe, 0x40ede928, 0x40284c18, 0xc01ee827, 0xbf02c29c, 0x3fb30eac, 0x3f1697dc, 0x4057b8f5, 0xc08d4c7e, 0xc0258c74, 0xc04dcb83, 0x3ed903e2, 0xbed75214, 0xc00a286c, 0xbf999bff, 0xbf25a5e0, 0x4063f57b, 0xc0115da9, 0x3f9754d6, 0xbff9ed95, 0xbfb13620, 0x3db9dc25, 0xc045abe7, 0x3e7153b1, 0xc005ebeb, 0xbf3cf3b4, 0x3f98def4, 0x3e4dd57e, 0xbef7a8fb, 0x40494157, 0xbdb4c8c2, 0xbed63c44, 0xbf049442, 0x3f63e0f8, 0x3f60d0af, 0x3f0800e2, 0xbf3f8546, 0xbfcefd79, 0x3e9fa888, 0xbe634c42, 0xbfc03936, 0xbfbe464d, 0xbf858026, 0xbfad93b8, 0xbea8677e, 0xbf16eca0, 0xbedf11c8, 0xbfb40702, 0x3eb63041, 0xbf856c6f, 0x3fef62a7, 0xbf001d97, 0x3fc6446e, 0x4059ff89, 0xbea7457d, 0x3f48fc80, 0xbfd2dda9, 0xbe8ee6a2, 0xbfd13e9b, 0x3e2976fc, 0x3f7caa1d, 0x3db2a63e, 0xbf406721, 0x3fa03d05, 0xbdd487a8, 0xbfc502bf, 0x3fa8b48b, 0xbfbb4e84, 0xbdeda599, 0xbe351f57, 0xbf22b22c, 0x3fb28d21, 0x3e45751b, 0xbf54e947, 0x3ef02512, 0x3fb9cef7, 0x3e96693e, 0xbe2e5d0f, 0x3f764882, 0x3f128d2f, 0x3ea11d41, 0x3e9f2fc4, 0xbdb9a42b, 0xc01808f2, 0x3e87b996, 0xbf4e009e, 0xc0603680, 0x3eb0bd1e, 0x3f660bee, 0xbf692d55, 0x3f5df50c, 0x3f661f35, 0xbf21ec0f, 0xbfb9d0ec, 0xbf79120d, 0xbee273c9, 0xc0094153, 0x3f40853f, 0x3fb8524d, 0xbf41239c, 0x3f9d6854, 0x3f9dfc30, 0xbf0d8641, 0x4006c6fb, 0x3e84dd6c, 0xbf8714dc, 0x3ec36e47, 0x3dbe4c14, 0xbf779646, 0xbfb69d7d, 0x3ee44ea9, 0xbeaafe8a, 0x3f8e6a40, 0xbd0ca697, 0x3c6128cc, 0xbdb0097b, 0xbf5faab2, 0x402e94bc, 0xc0014b18, 0xc0b1c8ce, 0x3fc5d98c, 0xc036ae1e, 0x3ff1b903, 0x3f272920, 0x3efd3234, 0x3f1b1ac0, 0xbdaf6b2b, 0x3f82657e, 0x40488530, 0xc001b8aa, 0xbe68215e, 0x3f486621, 0xbfa783e7, 0x406e7dfc, 0x3fc84b90, 0xc023f996, 0xbf3730e2, 0x3efe5274, 0xbe11a28b, 0x3f8326bf, 0xc03363ee, 0xbed7819e, 0xbf995883, 0x3f211277, 0x3e78f1da, 0xbfd3ad88, 0xbe62f017, 0xbc0d7249, 0x3fa2d955, 0x40039322, 0xc07e34f3, 0x40433d7a, 0x40f70cf6, 0xbf3def27, 0x408578d6, 0xbff1ce16, 0xbda126d1, 0x3f8d375a, 0xbfe26d42, 0xbe2080a4, 0x3e032930, 0xc09df67e, 0x3fe1c2d5, 0x3bd3e132, 0x3f2ee5d7, 0x400e1679, 0xc0ac3d4d, 0xbf994224, 0x401c717d, 0x3f89e00d, 0xbfd848d5, 0x3e8f1545, 0xbf95a0c2, 0x40632882, 0x3ff72069, 0x4019aece, 0xbf897b18, 0xbf91321d, 0x3fb2e988, 0x3fd43002, 0x3e7f27c1, 0xc00d9ebb, 0xc04287d1, 0x3fcd1b17, 0xc05a048f, 0xc0f17446, 0x3f27327d, 0xc00c8c6c, 0x4005c99e, 0x3fd5a1f6, 0xbf876d24, 0x4006532f, 0xbf9894b7, 0xbee5fbbc, 0x4051bf5f, 0xc0226cd2, 0xbfc1bd04, 0x3f764338, 0xc04c07db, 0x40ab5121, 0x403c7e83, 0xc06972a9, 0x3ff15769, 0x3fea28b8, 0xbeb1e4e9, 0x3ffba6f6, 0xc013b7d0, 0xc003c76d, 0xbf939a52, 0x4072d9cc, 0x3fce8a0e, 0x3dc352c5, 0xc00d82f3, 0xbf13aaf0, 0x3fbebdc4, 0x3f8006e2, 0xc00a7929, 0x402d3655, 0x40acbc38, 0x3e1f1972, 0x4087ccc8, 0xc058959c, 0xbf9b636b, 0x3f0c871c, 0xbfe091a6, 0x3ee215bc, 0xbfb2815b, 0xc04c1a00, 0x40038ef1, 0x3f8e28a1, 0xbfc62aca, 0x402af389, 0xc08b4ac6, 0xc0124f2e, 0x403710b2, 0x3e8f4ece, 0xbf5fc5ed, 0x3ed6f324, 0xbf7c7540, 0x405ca600, 0x3d966d21, 0x3c5fad5d, 0xbffab4f5, 0xbfa6c713, 0x401a9dae, 0x3ff8e4d4, 0xbeeb16ec, 0xbeec70e4, 0xbe40ef4c, 0xbfab2795, 0x3ec812bf, 0x4081e76c, 0xbf119156, 0x3f9fbf36, 0xc007c3f3, 0xbfc53d75, 0xbfcb1080, 0xbe0a978d, 0x3f05d81b, 0xbfa5d743, 0xbf5c09b5, 0x3fd88cce, 0x3ed2dfd5, 0xbf0c2fbe, 0x3f70c730, 0xc0438516, 0xbfaf330c, 0x3f8b41eb, 0xbf19db45, 0x3eefcb50, 0x3e13492d, 0xbfb173cc, 0x3f68163d, 0x3d719277, 0x3e19f01b, 0x3dca8e67, 0x3f23a667, 0x3ea2f4d9, 0x3d898f22, 0x3ed0b9c7, 0xbf23ad7f, 0x3f9360e6, 0xbfe45865, 0x4031856b, 0x40b077a0, 0x3ebe7d4c, 0x3faf3051, 0xbfa3c075, 0xbe3137a7, 0xbf1314b4, 0xbfda0051, 0xbf3299ea, 0xbde91ae4, 0xc008c110, 0x3f91af30, 0x3f22185a, 0xbeaeeee4, 0x3fe566f4, 0xc038711e, 0xbe571fef, 0x3fa493d4, 0x3d7c52dc, 0xbf75c8e3, 0xbf5609e4, 0x3f0b094b, 0x3fe4e23f, 0x3f2a77f8, 0x3ee43f1a, 0xc0250af2, 0xbfa73e83, 0x3f9edadc, 0x3fa801e6, 0xbf74fd10, 0xbf16f2b4, 0x408602b0, 0xbfdf46fb, 0x405a1026, 0x40c7a144, 0xbd0f3b2e, 0x40137476, 0xbed2c342, 0xbefac48f, 0x3ef9c524, 0xbf9a3617, 0x3ee7042a, 0x3fb7330a, 0xc076f643, 0x401e20f7, 0xbe37d4b0, 0xbf0e7251, 0x401a9976, 0xc049d4ba, 0xbf747822, 0x3fdc2738, 0xbf56fa43, 0xbf47be2b, 0x3f003b88, 0xbe9c493a, 0x4012b94b, 0x3fb88b48, 0x3fbe233d, 0xc003dd8a, 0xbfa6dca8, 0x3f12f0ec, 0x3fb9fbbd, 0xbe977c5f, 0xbf62cabd, 0xbf873f57, 0x3f862d2c, 0x3f9cc471, 0xbf196268 }; static const uint32_t ref_lotriangular_dpo[3111] = { 0x40000000, 0xbe12415d, 0x3f507b77, 0xbf964dc0, 0x3dcfcdc0, 0x3e5c5de9, 0x3e1ca407, 0xbece41fd, 0xbe5487af, 0x3e1753d7, 0x3f9b150d, 0x3ee3adc1, 0xbf124f07, 0x3f030729, 0x3e1411f1, 0x3e9d650d, 0xbe885f19, 0x3eb3b7cc, 0x3d1174c8, 0xbbff8338, 0x4031e257, 0x3f85d11f, 0xbf17ea07, 0xc003d368, 0xbff4e365, 0x3edd89f2, 0xc0749bb4, 0xc115df5b, 0x3f30c931, 0xbf9c6764, 0xbe81f480, 0xbe8b50f4, 0xbe23d9b9, 0xbdfee42b, 0x3cf752a9, 0xbd13d3cc, 0xbdad66b9, 0xbe463b3f, 0x3e5cc3d0, 0x3e86b22e, 0xbe47158a, 0xbdf2b5a8, 0xbe2bb467, 0xbf7cf8d0, 0x3fb8bd1e, 0x3f919e51, 0x3f3017b4, 0x3e31073b, 0xbf0c2ab9, 0x3f95a6da, 0x400fd4cb, 0x3f9c26d5, 0x3e36a314, 0xbee3bed7, 0xbfa64cb6, 0x3e5aa81d, 0x3f5b5a64, 0x40164fa3, 0x3bb5e65b, 0xbfab4eff, 0xbdbe59ad, 0x3f1e5e86, 0x3e5a4191, 0xbed8caa3, 0xc03a70b3, 0xbff21d44, 0xbe425f26, 0xc0ab4638, 0x408ae749, 0x3e5918d1, 0xbfb01f9e, 0xc0c7fa84, 0x3f08cce1, 0x4005255d, 0xc0c5a251, 0x410896c6, 0x408b37f6, 0x40b02b28, 0xc108a28a, 0xbcdffc24, 0x3ebfd717, 0x3dc92d36, 0x3e3259ac, 0x3eb94350, 0x3df67d08, 0x3da7c420, 0x3f1320e8, 0xbf0c2926, 0xbef6a82e, 0x3e9ffacd, 0xbe616389, 0xbf88c219, 0x3e808b0b, 0xbe0696d4, 0xbf26f372, 0x400fb2d2, 0x3f9d5d0a, 0xc0619440, 0xbf1c28d7, 0x3fc729ac, 0xc02b493c, 0xbb94a764, 0x3d61225e, 0x403b130c, 0x3fe4bffa, 0xbf87fb93, 0x3c833486, 0x3fcc251b, 0xbff0abb9, 0xbf3be93d, 0xbe81e588, 0xbf8cc0e7, 0xbf46a890, 0xbaf9260c, 0x3f083ccd, 0x3e9b8832, 0x3eb8ff41, 0x3ca46a87, 0xbf8343f7, 0x41331df5, 0x411f8c96, 0xc1281829, 0xc0d5c766, 0x410269ab, 0xc141a7ff, 0xbf7390e6, 0x4076fee6, 0xbf82bd0a, 0xbe4e7240, 0x3fd89b4c, 0xbd3e855c, 0x3fb59d2c, 0x3f4039ba, 0xbf83a978, 0xbe5c0904, 0xc0b98f98, 0xc0eda4a3, 0x40a7e07d, 0x402e441c, 0xc0662fd7, 0x409bc69a, 0x3f5d55d4, 0xc087fa8a, 0x3dc863ea, 0xbf18b969, 0x3ea2f852, 0xbd1469cb, 0xbd9b4c62, 0xbf27123d, 0xbe8c0b99, 0x3ea1a03d, 0xbf3188ac, 0x3f266efe, 0x4009c08a, 0xbf1c69af, 0xbe0270dd, 0xbf2b5fd8, 0x3fa6908e, 0x3eb1766b, 0xbf8c91cd, 0x3f4b9a23, 0xbe5a17f0, 0xbf864f43, 0xbf72e29f, 0xbf04a325, 0xbe6451fc, 0x3f1907c7, 0x3d649008, 0xbe86f626, 0x3f3d0f3c, 0xbf915825, 0xbee8bbf9, 0x3f29c4f9, 0x3f456208, 0x3f1c6533, 0xbef68b12, 0x3ee91058, 0x3f1e1e64, 0x3f12f914, 0x3e1b882b, 0x3dd92140, 0xc02db1b5, 0xbe36658e, 0xbd955eac, 0x400f395b, 0x3f1080a8, 0x3fa7fdbf, 0x3f15e160, 0xbf8dbb89, 0xc047ec46, 0xc036260f, 0xbf8441b6, 0x3f430577, 0x407a363c, 0x3d39c57a, 0x40534a18, 0x40078578, 0xc0177f42, 0xc03e0399, 0xc0867d64, 0xbfc4988d, 0x3f83603c, 0x403a3395, 0x3e84dc19, 0x4052032f, 0x40092f7d, 0xc09104be, 0xc0927fc3, 0xc0354504, 0xbcecb108, 0xbe5fc661, 0x3f8b5b24, 0xbd439f70, 0x3f217b39, 0x3f2807f3, 0x3fbc7254, 0xc009c246, 0xc0b7469f, 0xc08ad4c3, 0x4097b531, 0x40cc1b74, 0x3f9c7d48, 0x40b3e809, 0x40ae14ba, 0xbd4029b2, 0xbe063b64, 0xbe2e24b4, 0x3caef390, 0x3df40c49, 0xbdf29aee, 0x3c0a95c2, 0xbe2146de, 0xbe1b2736, 0xbd660336, 0xbe5cecdf, 0xbcedb202, 0xbe5fe412, 0x3cc21b4e, 0x3cd396af, 0x3d9d9f47, 0x3ebc4b5a, 0xbe38613c, 0xbe9aee11, 0x3d3f5ef3, 0x3e37abe8, 0xbe81a4bb, 0x3ec7984e, 0x3cd5f97f, 0x3e94f2dc, 0x3dc554fb, 0x3ddae471, 0x3e05760d, 0x3b8b5ee3, 0xbecb8b8e, 0xbe5859aa, 0x3de5c293, 0xbe1f68fc, 0xbea69e7c, 0x3d039ee3, 0x3e5bef8a, 0xbed1cb11, 0xbea66bf4, 0x3f2b66f4, 0xbd8ebd6b, 0x3d46236a, 0xbd94faf4, 0xbbe4c150, 0xbed8ebc8, 0x3d24531b, 0x3e07cbf7, 0x3ec7a57e, 0x3dd00215, 0x3f3ff7f5, 0xbf1c7db5, 0x3d93dd2e, 0x3d56d16f, 0xbea51232, 0xbe4b1698, 0x3dcdf1b7, 0x3fbbf711, 0xbee50c3f, 0xbe6f26c3, 0x3ec11f66, 0xbeaa2814, 0x3e3b573e, 0xbdda2dd1, 0xbd8c1612, 0x3e86ac5e, 0xbe7a1c8b, 0x3f091b28, 0x3e9392ca, 0x3d3a6308, 0x3ee6767a, 0xbd8655f3, 0x3ea55e34, 0x3e9e3ef3, 0x3f253777, 0x3e105c50, 0xbe6dba90, 0x3de03faa, 0xbf23d679, 0x3eb0028f, 0xbe270594, 0xbf5e0730, 0xbd80ec39, 0xbf18f027, 0x3db3fac6, 0xbde92bb1, 0x3e4f0d34, 0x3e7be1fa, 0x3e2fbc34, 0x3ec582d9, 0x3eb76369, 0xbe97fd4b, 0x3f22af2d, 0xbf5b7dc2, 0x3ed79371, 0x3f3ee23d, 0xbe2d45d1, 0x3f303603, 0x3ef9506d, 0x3ec6d5b9, 0x3f27392e, 0xbeb30ac2, 0x3f628f45, 0xbf1552ea, 0x3f54f986, 0x3ed0b514, 0x3ed93fd5, 0xbf28d18f, 0x3f5954eb, 0x3ee71285, 0xbef54bdb, 0x3f82636b, 0xbf7ba39f, 0x3dfbc0d9, 0x3e90cb88, 0x3e9339eb, 0xbe251b3b, 0xbf7a4f17, 0x3ea32019, 0xbed3a744, 0xbfa4ad54, 0x4005e04b, 0x3e0f2823, 0x3f2b18c2, 0x3f652f71, 0x3e8c04d2, 0xbf992109, 0xbe832acf, 0x3f996064, 0x3f8c4997, 0x3fd29438, 0xbf51d7c1, 0xbf42bd0a, 0x3f6b6f6e, 0x3f1d3212, 0xbfcedc7e, 0x3e5832b8, 0x3f49b629, 0xbf34eb09, 0x3f81393a, 0x3ecf0527, 0x3e1c33b3, 0x3e8eb90f, 0xbea35186, 0xbc93b95e, 0xbea0c578, 0xbf01dd8e, 0xbd1f8348, 0xbf5a6df0, 0x3f29b308, 0xbf0130fd, 0xbf90cb9e, 0xbfa25844, 0xbf587669, 0xc06dfd48, 0xc00ba0ac, 0xc00f81e7, 0x3fd845a6, 0x3fb473cb, 0x3e33de7d, 0x3ff6235c, 0x3d6efe42, 0xc0891e0c, 0x3f6eb771, 0xbed11b11, 0x40244f3a, 0xbdeb2ae6, 0xbf1653a4, 0x3eac2e06, 0xbfaf819c, 0xbf257730, 0xbf8f90b1, 0xbec3e79c, 0x3db95ef7, 0xbf44650e, 0xbf9cf772, 0x3f3a1d22, 0xbedfc742, 0x3e0ed934, 0xbf59d38f, 0x3f000bad, 0xbec74bd8, 0xbec6cf2b, 0x3f0144ff, 0x3f0091cb, 0xbda5d3a5, 0x3f154447, 0xc000d975, 0x3f3c9def, 0x3f76caf2, 0x3fbeef71, 0xbe789259, 0xbfe61a33, 0x400a7d08, 0x3f933b72, 0xc010cf7c, 0x404a49a6, 0xbf52a0d4, 0x3fd5f9f8, 0xbd488c37, 0xbf3d54b7, 0x3fa87b5a, 0x3e3bc61d, 0xc07802b7, 0xc01d6fa8, 0xbfa4a3d0, 0x4060a7c4, 0x40c80bd4, 0x402aea44, 0x3f1be34e, 0x3f6dcc6b, 0xbbcba916, 0x4127063a, 0x403a918a, 0xc0e230db, 0x40d99640, 0x422d7713, 0xc0dc3882, 0xc1b7ffea, 0xc10e7530, 0xc1ce14d9, 0x40a55bb1, 0x415d761b, 0x40bca7d4, 0x40792dfe, 0x416a07ba, 0xc0595f58, 0xbe38b6a2, 0x4019cbbe, 0xbf0c37e7, 0xbfb26f7b, 0xbf4a0983, 0xbfc5a234, 0x3f24b809, 0xbf66ea6a, 0x3f5e7994, 0x3f29256b, 0x3e3e5707, 0xc024e64d, 0xbf600f22, 0x3fe764be, 0x3f4380cf, 0x3f91bbde, 0x3d3d2841, 0xbf2bded0, 0x3f0b6fb1, 0x3f0ce8f7, 0xbe7418c5, 0xbf9b1181, 0x3d9eda05, 0xbf9f1464, 0xbf536897, 0xbf05c8dd, 0xbf2c9958, 0x3f322fbb, 0x3f1f6619, 0xbecb2851, 0xbf8dbfe1, 0x3df0d6a9, 0xbe235b15, 0xbe9f8483, 0x3ec90b5c, 0x3f49956f, 0xbe5c3907, 0x3f05d1c6, 0xbea2315f, 0xbfcc63e7, 0x3f430c3a, 0xbf76edf9, 0x3f1dca41, 0x3ecbec30, 0x3f810105, 0xbfd8b2bc, 0xbf0b9501, 0x3f556973, 0xbe20b249, 0xbeb0e98c, 0x3f27f200, 0x3e2095f9, 0xbe16f1d8, 0x3f7883e6, 0x3f414449, 0x3f4114d2, 0xbeecfda1, 0x3ecdb5a4, 0x3f4a36ab, 0x3f95941f, 0x3d0a236b, 0x3d729598, 0x3bd82d2b, 0x3f24a7c1, 0x3ed9c0f4, 0xbe3cbc60, 0xbdcb4ba1, 0xbf06a707, 0x3f198c68, 0xbc5ed337, 0xbf1f2dac, 0x3f2f1afc, 0xbfc07ad2, 0xbf6c1411, 0x3d1d46e1, 0xbebf35b0, 0xbec4aab3, 0xbf23896b, 0x3f0c5b49, 0x3eb0e257, 0x3f083fa6, 0x3e4717c5, 0x3e76ed79, 0xbe990927, 0xbdc2134b, 0x3cfaf7e9, 0xbe823e90, 0xbe077af4, 0xbe9bd2f1, 0x3cba7dda, 0xbe6578f6, 0x3e07cbc9, 0xbf5f54b1, 0x3f8518e3, 0x3e9e2f7d, 0x3f13dee7, 0x3e2af9ba, 0x3bbcb6c1, 0x3f24782b, 0xbe5f1d1c, 0x3de90b8b, 0xbf98c057, 0x3f0acb0c, 0x3f166d4c, 0xbe3c6ac2, 0xbf150bdc, 0x3e25988d, 0x3f44ee42, 0xbd16c412, 0x3dc70131, 0x3ec9e874, 0xbefaa62b, 0xbf1a6d16, 0xbe309e3d, 0xbf107667, 0x3eba995b, 0xbf1395f0, 0xbf8ea66a, 0x3e6b065a, 0xbec40ddf, 0xbf48b8a8, 0xbead8ad6, 0xbf0e6f38, 0x3e42b89f, 0xbe99cd1b, 0xbcbc52a3, 0x3ee7801d, 0xbe8e3c73, 0x3ea1bc0a, 0xbefe372f, 0x3e8a651e, 0x3deeecdc, 0xbf448d1e, 0x3c6fd3cf, 0xbcc3b3b9, 0x3e763271, 0x3f33747c, 0x3e487159, 0x3ca117a0, 0x3d4ca5b1, 0xbf6e5cf9, 0x3dee9390, 0x3f0b8c3a, 0xbe24ac96, 0xbd705419, 0xbf0a278f, 0xbb602a46, 0x3efc5a5f, 0x3e55c731, 0xbeb42796, 0x3eb07671, 0xbebb432d, 0x3e39b476, 0x3e5dc792, 0x3c37f565, 0xbda4116a, 0x3ec9cb10, 0xbf3a266a, 0x3c92fba6, 0xbe775a8a, 0xbe4ee33a, 0x3f5f1c6c, 0x3ec2aae8, 0x3e36d527, 0xbeb16e84, 0x3e92495b, 0xbd266be2, 0x3f08f638, 0xbe85424c, 0x3f1c1da8, 0x3e7a5b46, 0xbdeaf22b, 0xbec2b746, 0x3eb82b40, 0xbdc62d3a, 0x3e0f8b9d, 0x3f6669e6, 0x3e4569a3, 0xbd056548, 0xbf12a37e, 0xbe088f70, 0xbe844239, 0xbd3f775d, 0x3f81d1f8, 0x3ed745bc, 0x3cde1cae, 0xbf42e12d, 0xbe7c32a5, 0xbf277a76, 0x3ed7b0e0, 0xbed29a93, 0xbe107811, 0xbde95d3a, 0x3cc75d52, 0xbf3f8aab, 0xbf2ab919, 0x3e037c0a, 0x3e3b9767, 0x3d2e7aeb, 0xbeda3c6a, 0x3e98627d, 0x3f0b4638, 0x3f199556, 0x3cf95cb8, 0xbd7a45c5, 0x3c70a43e, 0xbda3a193, 0x3ecd3837, 0x3e5b1769, 0x3da02c44, 0xbefb5d06, 0x3eab8370, 0x3eb84c32, 0x3d288be3, 0x3e264ea8, 0xbd1a4cb2, 0x3e8e24bf, 0xbd7dae8a, 0xbd33dd02, 0x3e212022, 0xbe89b414, 0x3e5dd1a4, 0x3eb64695, 0x3f1e33e7, 0x3e9eaff1, 0x3f5f76c3, 0xbf0d7a5b, 0xbf3ab76e, 0x3f8432a5, 0xbe695eb4, 0x3e3fc402, 0x3e56019e, 0x3f1c35e8, 0x3e37c4b8, 0x3e659843, 0xbe010aaf, 0x3cd4d763, 0xbf3286da, 0x3e9017ab, 0x3e4ada54, 0x3e5b00d9, 0x3d911e68, 0xbe9d2f51, 0x3d676960, 0xbe9cdcc6, 0xbeadaf6f, 0x3e341a72, 0x3e501644, 0xbe563a07, 0xbedc78f2, 0xbf3b9e52, 0xbf6b4f73, 0xbec5ece6, 0xbba28655, 0x3f1a15ab, 0x3d906cb4, 0x3dbefa15, 0x3e987ab2, 0xbe19fd61, 0xbe2dea68, 0x3ed7b83d, 0x3cc7134a, 0xbe6d0240, 0xbd0ae864, 0xbde7298d, 0xbea018d3, 0xbdce1871, 0x3e12e438, 0xbe9c97b1, 0x3e0ca2c7, 0x3df05696, 0xbe90d703, 0x3da155fe, 0xbe852d44, 0xbf25d8d8, 0xbdbfa0c9, 0x3f169231, 0xbeec9353, 0x3ee98ada, 0x3e6f31a7, 0x3f2fb921, 0x3e8968e4, 0x3f1305ba, 0xbe87009d, 0x3e9cb593, 0x3f860601, 0x3da579c4, 0xbf063024, 0x3e8bd05d, 0xbed4a9ac, 0xbe509952, 0xbc0f84e7, 0x3cc31399, 0xbf0f9770, 0xbe5942d3, 0xbdcbb569, 0x3cb7b921, 0xbf0bf49b, 0xbf1018d9, 0x3f84f6ae, 0xbc1099ac, 0x3e197db2, 0xbe990695, 0x3eb3d833, 0x3c926c51, 0xbe3078f6, 0xbe75884b, 0x3f2df420, 0xbdbefce4, 0x3f159832, 0x3e38d6bd, 0xbeed0f34, 0xbe0d3b99, 0x3dbdb94f, 0x3d8c1283, 0x3ec45d3d, 0xbd9c5b1c, 0xbdc3f1cf, 0xbee13fee, 0xbf6bd01e, 0xbe87b09a, 0x3f353c45, 0xbdc583d4, 0xbde57f8b, 0xbeab6f08, 0xbee43cf3, 0xbe273027, 0x3f330672, 0xbd3a9773, 0xbe24f2e9, 0x3f24d95f, 0x3e6718f4, 0xbd382947, 0x3e8aece8, 0xbda9f79d, 0xbf6928aa, 0x3f1521c7, 0xbf352783, 0xbece4273, 0x3eff1e0b, 0x3ec97396, 0xbea832b2, 0xbfa0b145, 0x3eed8655, 0x3f290388, 0xbf82e1fb, 0xbf9776b1, 0x3f9061d4, 0xbe4dcf43, 0xbe68c27a, 0x3deeaa54, 0x3f4b82a5, 0x3ec2b59f, 0xbecc4b3a, 0xbf0d8c8e, 0xbf2c3aa3, 0x3f696076, 0x3fb68b39, 0x3e5dda9c, 0xbef56f99, 0xbe2a34e1, 0xbf02f4c0, 0xbe3bb6a4, 0x3f33f772, 0x3eaff2d8, 0xbf87fe3c, 0xbec9c854, 0x3e32f764, 0x3efaf53e, 0xbee6a415, 0x39f9efa9, 0xbe8763d7, 0x3dda9ff8, 0xbd3aa5dd, 0xbedd8c98, 0x3d832186, 0xbfb47fc6, 0xbed5ff00, 0x3ea42738, 0xbd95ab06, 0xbf5e8ef0, 0x3f8b8538, 0xbfc16dc9, 0xbe376709, 0xbf482809, 0x3f8df2bc, 0xbf9aacbc, 0x3da2a8b2, 0xbfc30971, 0xbc0c0204, 0x3f5d2cf0, 0x3fc09838, 0xbfaedefe, 0x3f0ca2bc, 0x3f078e4c, 0xbeb77eb1, 0x3f819b44, 0xbdf75aa7, 0xbe8843d0, 0xbe0717bb, 0x3f4d14b8, 0xbf52eabe, 0xbe4e0df7, 0x3f98f0d0, 0x3e7070fd, 0x3ec5c517, 0xbf5d9bca, 0xbd883cf2, 0xbd0557a2, 0xbfa89f11, 0x3f0a9479, 0x3ed1539a, 0xbea13c24, 0x3f66424b, 0xbd32e9e6, 0x3dd7ba0b, 0xbeaa41a8, 0x3e721e75, 0xbfbe9139, 0x3ec04d91, 0xbe119fe1, 0x3f6e19f1, 0x3fa4da1a, 0xbf40f649, 0xbf1a9a4b, 0xbf420608, 0xbf877830, 0x3e5f6493, 0x3f85c930, 0x3fafcc4c, 0x3f269bf8, 0xbfce3d8f, 0xbd8c49e9, 0x40185632, 0x3fdf566e, 0xbff97ec5, 0xbd3437f0, 0xbe5d0717, 0x3c8527b0, 0xbedcafd8, 0xbf545681, 0x3d137326, 0xbde152d5, 0xbf521d4e, 0x3eb67c72, 0xbd921318, 0xbd94a89c, 0x3f63df3e, 0x3cca1cd5, 0xbf22d4c7, 0x3f278440, 0x3fb5d8e2, 0xbe97ba94, 0x3f30ea32, 0x3e7e5736, 0xbdf0989d, 0x3dbc43e2, 0x3f1fb984, 0x3eacb170, 0x3eada1b7, 0xbea965de, 0x3f82c636, 0x3f4bd179, 0x3d51460e, 0x3e53837a, 0x3ffc7463, 0xbf73b6dc, 0x3f4ca677, 0x3f6b88b6, 0x3e0010f2, 0xbeb3f0a7, 0x3fdd12a6, 0xbf25a971, 0x3f36acb4, 0x3fc8ee85, 0x3f8d3c94, 0x3fe70af6, 0x3da78507, 0x406bc062, 0xbee8f06f, 0xbfad6d00, 0xc0070ceb, 0x3cb80e69, 0xc009027f, 0x3e181a37, 0xbea85189, 0x3fcead4a, 0xbfb4647f, 0x3fce1787, 0xbf6d3f1b, 0x3f45f195, 0x3eb3b228, 0x3f7c9f5e, 0xbf44554a, 0x40034df2, 0x40f334b0, 0x3fe9fe15, 0xc0cd3693, 0x3f51cd17, 0x40597361, 0xc0867229, 0xc048d5cc, 0xc08117a9, 0x4018b9b1, 0x3e2b392c, 0x40d42502, 0xc0936c46, 0x40d51b43, 0x4003af10, 0xc028aea3, 0xc0300a28, 0xbcbbbad2, 0x3f8798b4, 0xbef51a88, 0xbff756c8, 0x3ff107cc, 0xbf074f2d, 0xbf953a72, 0xbf8e905e, 0x3d20689a, 0xbfd0e3d3, 0x401af5b6, 0x3f6dbda4, 0xc030e3ef, 0xbebb059a, 0x3f0d1506, 0x3e8e1c89, 0x3f241996, 0xbe1b03a6, 0x401878d2, 0xc0572ca8, 0xbf9a79af, 0x3fbac983, 0xc0131ea6, 0xbf0d98ba, 0xbf0cc470, 0xc0a32a21, 0x3f33afef, 0xc0242632, 0x3e95ed31, 0xbebf0b0b, 0x3f94e75e, 0xbee288f3, 0xbf58b34e, 0xc0f299a0, 0xbe3c74dd, 0xbe0051e8, 0xbd4e98d2, 0x3c82d7c2, 0x3e393137, 0x3e86a871, 0xbc2c1441, 0xbe31603a, 0x3d876ee2, 0x3d954aaf, 0xbda9afb1, 0xbe0ec959, 0x3e0c728b, 0xbdf87ca4, 0x3da128cf, 0xbd9996de, 0x3e2f693d, 0x3e59cca0, 0xbe414aad, 0xbc303506, 0x3ca9dae7, 0xbdb2c350, 0x3d60007e, 0x3ddafbb1, 0xbd10c04a, 0x3e4cc606, 0x3d654f71, 0xbdf21fb2, 0x3e13015b, 0xbe346955, 0xbd1f14e9, 0xbe9e2ff4, 0xbd8004ec, 0xbd06c658, 0xbc8caee9, 0x3d867fe3, 0xbeafa7dc, 0x3e20926f, 0x3c29de63, 0x3eb41e46, 0x3dabd5ef, 0x3d79cf0f, 0xbe48a629, 0x3e2fdec2, 0xbe58e318, 0xbd9729cc, 0x3d803351, 0xbe4f4ea6, 0xbd339c1e, 0xbcb55f27, 0xbe272865, 0xbe96dd74, 0x3c406182, 0xbd319cf1, 0xbebc56fe, 0x3ab9e445, 0x3d573db9, 0xbe225644, 0x3e18356a, 0x3e2d8c48, 0xbbeaffee, 0xbd64136e, 0xbd33d285, 0x3e3fe3d9, 0x3ea17aa1, 0x3ec189c7, 0xbe476113, 0x3d0ce156, 0xbdf100c6, 0xbf4563b6, 0x3ed95ade, 0x3e8f8113, 0xbeebe77e, 0xbf1232f4, 0x3efde84f, 0x3dc59d74, 0x3e804763, 0xbe6139dd, 0xbcefab2e, 0x3ecb857f, 0xbcf1b2f7, 0xbd109062, 0x3f2b550f, 0xbd98fff1, 0x3e4b36fd, 0xbd90f1d2, 0x3dbba9d3, 0xbe782c90, 0xbdf20c96, 0xbf073878, 0xbeca1bcf, 0xbc2645cf, 0xbec676c0, 0x3ef75379, 0xbd061eb2, 0x3eb8e3a7, 0x3e8ef0b1, 0x3d82dfec, 0x3dc50fdf, 0x3e1a5529, 0x3e5e088c, 0xbe28ec2d, 0xbeac1c01, 0xbe567267, 0x3ca445ba, 0x3ecc929f, 0x3e9ab202, 0x3e7bec1d, 0xbe609ec7, 0x3edc8208, 0xbe28f0a1, 0x3eced418, 0x3d96ddeb, 0xbe850a01, 0xbda8a704, 0x3f0ee9fb, 0xbda2cba8, 0x3f04512f, 0xbb6eed4f, 0xbd25a456, 0xbeb10dd6, 0xbdcdd4bf, 0x3e7d9b33, 0xbb998fa5, 0x3e1e4d84, 0x3eec9eeb, 0x3d95a1ac, 0xbd2723a2, 0xbc9225fd, 0x3d0e30e3, 0xbea54274, 0xbe264b47, 0x3cc43726, 0xbd102afe, 0x3d8bf352, 0xbc74badf, 0x3ef1bf0c, 0xbebab81e, 0x3e3364cd, 0xbf41b040, 0xbf11d3cb, 0x3ebeff59, 0xbe6ada72, 0xbea9041b, 0xbdbe08a4, 0x3e84395e, 0x3eb25c6b, 0xbeb9c08c, 0xbef29567, 0xbd2edb34, 0xbe921485, 0xbeda1518, 0x3e2412e1, 0xbe48b489, 0xbdaf035b, 0xbd3e6d31, 0xbdb93e67, 0x3b7784e8, 0xbd1619b5, 0x3eefca06, 0xbeaca62d, 0x3d715659, 0x3f059286, 0xbd3b2170, 0xbe7ac421, 0xbe0f4abc, 0xbe802ced, 0x3d35a1af, 0xbeb40d3c, 0x3e436931, 0x3f055c4b, 0x3ebcaab0, 0xbe6a6d29, 0x3acee976, 0x3e5b8c79, 0x3f0f4169, 0xbe836443, 0xbe5fcaad, 0xbe93726a, 0x3f3e267a, 0x3e1204af, 0x3d026a32, 0x3ebe3b4c, 0x3e750bff, 0xbce126ff, 0x3e670f36, 0x3e076274, 0x3e8c2265, 0x3e0136f2, 0xbf339333, 0x3eabdd32, 0xbea99787, 0x3f3c9c63, 0x3b961ce8, 0xbe9c8742, 0xbf0c1c21, 0x3ebd02e6, 0x3ee0034f, 0x3d43085c, 0xbde54feb, 0xbe761ef3, 0xbe03f395, 0xbef4e712, 0x3d5736b9, 0x3d786bf4, 0xbd94ba26, 0xbf0006e4, 0xbdfe7f39, 0xbe62f227, 0x3deca80f, 0xbe8062b8, 0x3f657c3d, 0x3e94da75, 0x3e185ad9, 0x3f4cc4b1, 0xbd5545c7, 0xbed90261, 0x3e71bb68, 0x3d0c9b7a, 0x3e166439, 0x3ba3fd6e, 0xbd1da28a, 0x3eafdcae, 0xbe8f76d2, 0xbeceef21, 0xbe981fd4, 0xbdba30b5, 0x3e5fe960, 0x3e675641, 0x3e68a1e8, 0x3e4601fe, 0x3e6938a0, 0x3ec0f7cc, 0x3ee6a077, 0xbe8a96dd, 0x3ea9484f, 0xbe0e8220, 0x3bdbfc8f, 0x3d9c0efa, 0xbe80469c, 0x3e17ecea, 0xbee8a15f, 0x3b85e208, 0xbe98a59a, 0x3e6dc16d, 0xbdc4bccb, 0xbeed58fb, 0x3eda6be0, 0xbdcd858a, 0xbe0ad90d, 0x3d8762ff, 0x3d216163, 0x3e5ba47b, 0xbd81a633, 0xbd71e83e, 0xbc121a59, 0x3ea2a519, 0xbe42e03a, 0x3cec2526, 0xbe9a4fc9, 0x3eb85ae6, 0xbe55b30f, 0x3e67b349, 0xbede34ce, 0xbec94ff7, 0x3da839ed, 0xbd95e8f4, 0xbe922c68, 0x3d725552, 0xbc18b843, 0x3f0f8566, 0x3b85aeca, 0x3cb2dc1e, 0x3dc3f302, 0x3dfbbf62, 0x3d4c33f4, 0x3eadf721, 0x3f374d50, 0x3e100efc, 0x3e5098e4, 0x3e0583fa, 0x3e1497e1, 0xbebd8c9f, 0x3e09fe5e, 0xbed3f97b, 0x3e4ebf4a, 0x3e5e4ed5, 0xbe9ab0e5, 0x3dd21737, 0xbebc0a10, 0xbd289633, 0x3ebbe632, 0x3de6445c, 0x3de18ce8, 0x3f509367, 0xbf2fc749, 0x3f3c87d8, 0xbe0581c4, 0xbf735888, 0x3d9f896b, 0x3f500212, 0x3e4edcdf, 0xbf08164e, 0xbf6ce320, 0xbc73e156, 0xbeb714af, 0xbea24a7f, 0xbf684f5b, 0xbd8f37f2, 0xbe1e56aa, 0xbf1f6037, 0x3ed77631, 0x3e7fb68e, 0x3c1962e6, 0xbe44d700, 0xbed4a3e4, 0xbe099399, 0x3f02fe15, 0x3d3eeb8d, 0x3f1b2102, 0xbd076db8, 0x3e241a3e, 0x3daf603f, 0x3edc564a, 0xbe9f8648, 0xb82dcd91, 0xbe1fdef1, 0x3bad36b9, 0x3e52b021, 0xbee8d2fd, 0x3f538666, 0xbf2f5488, 0xbf351d16, 0x3e8151f7, 0xbec4fefc, 0x3dab936d, 0xbefcac5d, 0xbea0a5b5, 0x3f3fec0b, 0x3f03fd3b, 0xbf37f5aa, 0xbed71e0f, 0xbd0a2c50, 0xbe0eab81, 0x3da2b41c, 0xbe806a96, 0x3e9561a1, 0xbe3d5c8b, 0xbdbc400a, 0xbe0b324e, 0xbea9a2d0, 0x3d53717b, 0x3eb04098, 0xbf129b3a, 0xbd0ded4e, 0xbfa9b06b, 0x3f17b4c4, 0x3f22386f, 0xbee234b3, 0xbd994144, 0xbec8ceee, 0x3ecc0738, 0xbf75e6be, 0xbf118d0c, 0xbf8c6a0c, 0x3e8e5f2c, 0x3e425b28, 0x3e88451b, 0xbe8b9668, 0x3ee553cd, 0xbf4f5da2, 0x3f11d81d, 0xbe7bb231, 0x3eca0751, 0x3f1575ca, 0xbe146506, 0x3ed2cf91, 0x3e6fdc2f, 0x3ed1368e, 0x3d98b71e, 0x3e1ed25d, 0xbe88a4b2, 0xbdd8c867, 0xbf5b32b8, 0xbefe6f9e, 0x3fa15f60, 0x3eb34d93, 0x3fb9e74b, 0xbe6ced19, 0xbf97c2bf, 0x3ec1570d, 0x3d27a0d7, 0x3f2cbbac, 0xbedffe8e, 0x3f85c7b7, 0x3f0c07ea, 0x3f69fc9f, 0x3ec24823, 0xbf4e3495, 0xbea48414, 0x3ec61ca6, 0xbe0a2747, 0x3f4aeefd, 0xbfdb1a14, 0x3e86e9eb, 0xbefc304a, 0xbfcc8ff4, 0xbdf80589, 0xbf298419, 0x3e84885c, 0xbda171c3, 0xbe3474da, 0xbd504cbe, 0x3f8cbdeb, 0xbecc557c, 0x3f28c1cf, 0x3f3b8da4, 0x3cdf7f64, 0xbe0e9813, 0xbe244c53, 0x3dff6506, 0xbea0b9e9, 0xbea90d61, 0xbf220599, 0xbe84ac4d, 0xbe56572d, 0x3e2d4a11, 0x3f0137d4, 0x3ec35cd5, 0x3db36808, 0x3f05629a, 0x3f0915f7, 0xbe828283, 0xbeaaf569, 0x3f11e791, 0x3e8a82d1, 0x3c1dd3c4, 0x3f04f86c, 0x3f426500, 0x3daac6e4, 0x3f22022d, 0xbcc3d6e8, 0x3d7231b4, 0xbe8b3154, 0x3e01a143, 0x3dbabfd4, 0x3e9afd97, 0x3ea9a3f4, 0xbe69323e, 0xbf30c884, 0x3f1ae2e5, 0xbe9e1081, 0xbf3105f1, 0x3f4b1fbd, 0xbf51e56d, 0xbcc494d1, 0xbdd933c9, 0x3f0d4435, 0x3ec08d97, 0xbef63059, 0xbf128b33, 0xbdb2164f, 0x3d21ec2e, 0x3d05104a, 0xbcb675be, 0xbcbb6824, 0xbe523d90, 0x3ef4911b, 0xbe849d93, 0x3ec25d8f, 0x3dae12f0, 0x3cb596e4, 0x3f35090b, 0xbe5b2a9f, 0xbe1acb7e, 0x3dbb3827, 0x3ea6e2fa, 0xbd8921ee, 0x3d9d0912, 0xbe30c7df, 0x3f117e28, 0x3f536949, 0xbd86052f, 0xbeaefe04, 0x3f134b45, 0x3e4601f2, 0x3db5100b, 0xbeae5a9d, 0x3f44db45, 0xbe14e9a7, 0xbe31ea97, 0xbf829490, 0x3f15cd6e, 0xbe9b45b4, 0xbeb810ae, 0xbf23a4d9, 0xbf10f7e5, 0xbec69a55, 0x3f9f9899, 0xbfb4c33b, 0xbdbd2d61, 0xbf472bf9, 0x3d55383a, 0xbe4837c4, 0xbe9b8c22, 0x3e36f254, 0xbe98c024, 0xbef80847, 0xbef4b3c0, 0x3d60240f, 0x3eb42f91, 0x3f2b2504, 0xbd8057bf, 0xbf91bbfc, 0x3f0edc46, 0xbfb9f447, 0xbe7d3e5a, 0x3f0a06a4, 0xbee78047, 0x3c15193c, 0xbf1a5d37, 0x3f9686dd, 0xbe2d2b8a, 0x3e7953ca, 0xbf4e93a5, 0x3eeff53b, 0xbe92bc1a, 0x3f1dc1bd, 0xbf06ed66, 0xbee5883d, 0xbf16bfad, 0x3fbc02e4, 0xbe9e0017, 0x3ed748d4, 0x3e34a785, 0xbe211b53, 0x3f8aca1a, 0xbe5840b1, 0xbeba38d4, 0x3f22264b, 0x3e2089f0, 0xbeb1ce7b, 0xbcc71e49, 0x3d74b97b, 0xbe8795c4, 0xbf9b127d, 0xbe3480fd, 0xbf1be23f, 0x3f1df603, 0x3f917b71, 0x3ed77f3b, 0xbecb1557, 0x3ed21c1c, 0x3eec74ca, 0xbf1ee67c, 0xbf358630, 0xbeff10f9, 0x3e16fc7c, 0xbf14dece, 0xbe2e1266, 0x3cb71006, 0x3d1319b4, 0xbec98980, 0x3f0c5983, 0xbf076ba2, 0xbe0507f3, 0x3ea025f4, 0xbef99b91, 0x3e4358cd, 0xbea10085, 0xbf1a8832, 0x3d695698, 0xbeb0324a, 0xbebf8fae, 0x3ddd921e, 0x3eb3548d, 0x3cf9b21f, 0x3f78a87e, 0x3f4e1dad, 0x3f9c2a8c, 0xbea5681b, 0xbecc8449, 0xbf055c63, 0xbde35fd5, 0x3d9fb3d3, 0x3c19ecfa, 0x3f1ee53c, 0x3fdef51f, 0x3f6d39d7, 0xbba6c6aa, 0x3eeeda6e, 0x3e6158ab, 0x3f1d894f, 0xbf3f5afb, 0x3f64c5d1, 0xbf310e24, 0x3f089631, 0xbf12f444, 0xbe93a2c3, 0x3f1e5b3f, 0xbbb49b9e, 0x3de91858, 0xbd9774ba, 0xbf017ef3, 0x3f2882ec, 0x3f45ea0f, 0xbf66ef27, 0x3e287eec, 0xbf939720, 0x40431426, 0x3ee8c926, 0x3fd8b391, 0xc0347f47, 0xc0172640, 0x3f886752, 0x3f5d36e7, 0x3fc13a65, 0xbf9d09f7, 0x3fbd4726, 0x3ea710fd, 0x3fc0ceeb, 0xbb576a91, 0xbfa63985, 0xbdf1cd08, 0x3e590f05, 0xbf96602f, 0x3fe29849, 0xc0488e2f, 0xbcb49564, 0xbfef776d, 0xc037ff08, 0xbe1ce251, 0xbe7e1a61, 0x3f03f519, 0xbf953617, 0xbe900a61, 0x3e8c8eb2, 0x404b3f7f, 0xbf849a9c, 0x3fed4a94, 0xbf5fe897, 0xbe47ca5f, 0x3daaed22, 0x3f3dc3c7, 0xbe99a776, 0xbea55915, 0xbe133dd5, 0xbe9d3068, 0x3f313e85, 0x3f4739f6, 0xbef8bc30, 0xbf839992, 0xbcf76f3e, 0x3f5c136c, 0xbeea878f, 0xbf8de5c3, 0xbeb292fc, 0xbf983e03, 0x3f686f86, 0xbfb49f88, 0xbf946d0e, 0xbf3d0789, 0xbf979d3f, 0x3f06d626, 0x3f80f8b9, 0xbe05b5ab, 0x3f2bd0f4, 0x3e97c47d, 0x3e9d764c, 0x3ed5dbae, 0xbf1871f6, 0xbe365e95, 0xbf2f785f, 0x3fb97c70, 0xbe8312d4, 0x401b5aef, 0xbf84dedd, 0xbfe17fa1, 0xbe124d11, 0x3f50cb6b, 0x3f8063ca, 0xc00a61e3, 0xbed98c13, 0x3f190f9b, 0x3f38be3b, 0xbe4f50a7, 0x3f4342f6, 0xbf8684a1, 0xbd98ed6b, 0xbe092d6c, 0x3f850778, 0xc02a1752, 0x3f9a2181, 0xbf9ac8cb, 0xbf959f0d, 0x3efb8bef, 0xbec83535, 0xbd9234e4, 0x3f1c22e8, 0x3d8e8cd2, 0xbe60f430, 0x3fa6775e, 0xbe4fa120, 0xbd03de3d, 0x3edc2bad, 0xc01ea102, 0x3e047c14, 0xbeb5a34e, 0x3cd56ded, 0x3ff3813c, 0xbed72e13, 0xbf66b64d, 0xbf0093f8, 0x3f5d74f0, 0xbef6589b, 0x3f45db9d, 0xbfb5fc01, 0x3f4a1d5c, 0x3d173f01, 0x3ea03609, 0xbf6cea8d, 0x3e1bb92e, 0xbfeb608f, 0x4014678c, 0x3e41a831, 0x3e8b76c4, 0x3f8683e6, 0xbeb449ed, 0x3f2c2edd, 0xbeef86c0, 0x3f0b86c5, 0x3d4c7ced, 0xbf23e58a, 0xbfeab46b, 0x3e7cbb56, 0xbc8dfe13, 0xbfc385ff, 0x3ffec1f7, 0x3fcf29aa, 0x3f018126, 0xc0467f33, 0xc04bb1f0, 0xbe7ffb65, 0x3ff60cfc, 0x3fbb8acc, 0xbf4135ab, 0x407818ce, 0xbf03cfde, 0x3fa3e55a, 0xbe25f035, 0xbf84403a, 0x3ef72004, 0x3debd660, 0xbf22d6c2, 0x3f62de25, 0xc05fa287, 0xbfed68ff, 0xc030e091, 0xbfdf6398, 0xbf876744, 0x3f919117, 0x3d886fc1, 0xbfa61eac, 0x3e51dcff, 0xbed1a926, 0x402d274a, 0xc04f8a18, 0x400210aa, 0x3e4c2eae, 0xbec7cabb, 0x3ee2f169, 0x3fb6117e, 0x3e37437d, 0x3fa64dd9, 0xbe840afe, 0xbfae294e, 0xbee4d350, 0x3e3d1407, 0xbfb2e51b, 0x3fbe4168, 0x3ec09ac0, 0x3f14d36f, 0x3f1f4445, 0xbf60435a, 0x3c8e92f2, 0xbf4d72d7, 0xbf91a880, 0x3f94f6b2, 0x3fcde083, 0x3f9fa75c, 0xbe2016aa, 0x3f4b26b9, 0x3e78860b, 0x3f0bc3c7, 0x3fa1323c, 0xbe5e224e, 0xbd1c6f44, 0xbf9e59c1, 0x3fdaad85, 0xbf4f7162, 0x401cdede, 0xbeed4056, 0x3fbd7641, 0xc0381c81, 0x3df5eb2a, 0x408fa2a4, 0xbfbc5187, 0xc069eda6, 0x3ebaa03f, 0x405ec726, 0xc09b1b1c, 0xbf5d61c9, 0xc006417b, 0x3e461ad4, 0xbe604719, 0x3f9b31dc, 0xc02ef50a, 0xbed7b522, 0xbf14ab26, 0x403daa99, 0xbf9fbc65, 0x401c0aff, 0x40009849, 0x403729d5, 0x402f2d66, 0x3f615f20, 0x401d02a1, 0xbfc476dd, 0x3fc5bae0, 0xbf18130d, 0x4002cf5c, 0xbffe35cf, 0x3fd83f5b, 0xbec547ce, 0x3f3374ce, 0xbfed887b, 0xbf1cbce6, 0x4023f8e8, 0xbf001e9d, 0xbfd321f4, 0xbf8cbb3a, 0x3f96f0d9, 0xc0131c80, 0x3f340faa, 0xbfab3e68, 0xbf689895, 0xbf37127c, 0x3fc8768e, 0xbfa57531, 0xbe77b464, 0xbf239aaa, 0x409d3171, 0xbc9fdfc4, 0x3ff2581c, 0x401b9d12, 0x3fb45d19, 0x3fad3019, 0x3eef5195, 0x400c1c07, 0xbf75a7cd, 0xbea72663, 0xc002df47, 0x3fade129, 0xbfa8eab0, 0x3f1e117b, 0x4039347b, 0x40b48828, 0xc01fa647, 0xc0bc90e6, 0xbd35ff73, 0xbf727ff1, 0x400905b6, 0xc048372b, 0xbff9d7bd, 0x40023515, 0x40935691, 0x3e48b5b9, 0xc02a6512, 0xc0581ca6, 0x402d9fe6, 0xc02782e1, 0xbe66e403, 0x4009ef59, 0x409234ba, 0x40010aa6, 0xbed9e090, 0x3f03e1a8, 0xc009228f, 0xbf210746, 0xbf5cec6d, 0xbff8a471, 0xbff32dff, 0xbf6d21b8, 0x4037a4ab, 0xbf3d3467, 0x404b2a67, 0x3f4afeb3, 0xc09314ff, 0xbfcdf05c, 0xc0a7f595, 0x40120a56, 0x409abd99, 0x3fcbab97, 0x40177579, 0xc05cb563, 0x3fc9a510, 0xc0232c21, 0x4002f64f, 0xc05d182c, 0xbf962b6d, 0x3f6049da, 0x3fafb5c7, 0x3fc4d7ba, 0x40035023, 0xc0238549, 0x4117e0d3, 0xbfa0b9a0, 0x40705135, 0x40a7d1c1, 0xbffe7440, 0xbe6e61bc, 0xc02e95cd, 0xbfe9a7ee, 0x3effd9ec, 0xbfb015cb, 0xc0a813c7, 0x3fed640a, 0x3e9a0141, 0x3f151bdb, 0xc0806451, 0xbf2cfe4d, 0xbfd4af1e, 0x404cbaee, 0xbf601781, 0xbf90ff1a, 0xbf5760a4, 0xc031a951, 0x3ef29de7, 0xbfea0123, 0x3fdb1b7c, 0xbfd9b4e2, 0x3cb15b48, 0x3ede1b9d, 0x3f8c18ef, 0xbee69e64, 0x3ea64410, 0xbef613a9, 0x40550e48, 0xbe8cb0e1, 0x3fa272eb, 0x40a4b9ae, 0xbe8ba48f, 0xbf38b411, 0xbe950b6e, 0xbfeb4387, 0x3f4df493, 0xbc8a5f8d, 0xbf13b5b7, 0xbe94afe2, 0xbf298f8d, 0x40f2619d, 0xc1347648, 0x4003a20a, 0xbf4a1da9, 0x3f55e0f3, 0x40c9d423, 0xc0933366, 0xc117eaef, 0xc0cfd8fd, 0xc110ffb6, 0xbfc27347, 0x41be8e0c, 0xc094cf94, 0x3d7341f2, 0xbf08957f, 0x40c7849e, 0x3febfe58, 0x3f2c782c, 0xc0e6415d, 0x420e058c, 0x4139192f, 0x410b9f06, 0x418fbbe9, 0x3e407db7, 0xc05685b7, 0xc0807eba, 0x404b04a3, 0xc0b586da, 0xc03f4823, 0xc11eb37c, 0xbd4bca36, 0xbf892c2f, 0x422422c6, 0xc2348453, 0x423664d3, 0xc237adbe, 0xc234ebb3, 0x4206d7b7, 0xc1e74590, 0xc1efdb66, 0xc2857006, 0xc1821f49, 0xc10c54d3, 0x43018a77, 0xc2541549, 0xc1782038, 0xc24cfce7, 0x4294115d, 0xc167cbc8, 0xc0c755ca, 0xc11db264, 0x4375f2f4, 0x41eb5c6a, 0x421690ed, 0x42e16d9b, 0xc10d44e9, 0xc191b402, 0xc1b5a357, 0xc1037c64, 0xc1c24413, 0xc16b850f, 0xc1fb5f26, 0xc166e384, 0x40bb8195, 0x3d92d47d, 0x3d91e0c1, 0xbd86cffe, 0x3d0d9edb, 0xbd54f8a7, 0xbd8cca4c, 0x3b0d886b, 0xbc98b462, 0x3cf228be, 0xbc8bdedf, 0x3cb8776e, 0xbca3e7e9, 0xb8c904a0, 0xbd9bc0ae, 0x3e334a3b, 0xbd951a1c, 0xbaec1b11, 0xbeb87d41, 0x3da40c5b, 0xbc85d7ed, 0xbdc8919a, 0xbcedf70a, 0x3d92819d, 0x3de26abb, 0x3a6c0192, 0x3c6bb41d, 0xbd8999ae, 0x3e085af9, 0x3b816206, 0x3e15e3d8, 0x3db45e50, 0xbc8b5e28, 0xbcaa46c9, 0x3e2d30bd, 0xbe9b1654, 0xbe0c0f92, 0x3cde84ab, 0x3df09a35, 0xbe60b832, 0xbdae7b74, 0x3d8d3d7a, 0x3e54629e, 0xbdb4f163, 0x3db79632, 0x3d552c73, 0x3d8ab132, 0x3e0b5fd2, 0xbedcb48e, 0x3df37d9d, 0x3e0af40c, 0x3e789b4d, 0xbdfaf55a, 0x3df00a42, 0x3c9ffcb4, 0xbdc106df, 0xbeba32b9, 0x3d1f6d4f, 0x3da7a7c5, 0xbd044c22, 0x3c6b7f22, 0xbc0e2b63, 0xbdaeda5f, 0xbec2b06d, 0x3c976db5, 0xbd7ce8a4, 0x3dda6d8e, 0xbde4efcb, 0x3c5f3ed7, 0x3e87cb07, 0xbe2787af, 0x3dbda150, 0xbd4a4320, 0x3e25c3ee, 0xbe0f1a75, 0xbe454d3e, 0xbdfe8edd, 0xbe8edb17, 0x3e2a5260, 0x3e235276, 0x3dc3f3a0, 0x3e0db3b7, 0x3da333a7, 0xbe00ec40, 0x3e2ac6a9, 0xbdc407c1, 0xbe2e4d23, 0x3d6e0681, 0x3ddd3c11, 0xbc558934, 0xbdc6d2f3, 0xbdc0bfe9, 0x3dea6cc8, 0x3d01c226, 0x3e52013c, 0xbd6d3545, 0xbe144044, 0xbe631d91, 0xbd4a2fa4, 0xbd7a8ae8, 0xbecb3f3a, 0x3e3c7d46, 0x3ef485e2, 0x3e6a3d66, 0x3cb05a90, 0x3efd325f, 0xbe6f9c43, 0xbe4682cb, 0x3ecb1e84, 0x3ed3fa61, 0xbe8d6d28, 0xbe9ed0ef, 0x3dc686bb, 0xbb2685bb, 0xbee88074, 0xbd69a2c8, 0x3e7bfbd6, 0x3eef035a, 0x3eb055a6, 0x3f118784, 0xbdeae8d3, 0x3d16e456, 0xbe35be55, 0xbd117d97, 0x3e4a11d5, 0xbd7b63ab, 0x3c4019f3, 0xbe2d2964, 0x3ea23b67, 0x3f23fddf, 0xbe1be6c5, 0xbdf80d99, 0x3e4ad039, 0x3e20587a, 0xbe7dc8ae, 0x3dd31bf0, 0xbcf936a8, 0xbd4d3cc3, 0x3e7a6f95, 0xbd905fd9, 0xbcb12401, 0x3e1e40ac, 0xbea74468, 0x3dd310cb, 0xbe4c30ec, 0x3e2d7538, 0x3d9d6b77, 0xbeb592e6, 0x3d63ee22, 0x3e05f812, 0x3ea4f2ee, 0xbf064c47, 0xbf034dcf, 0x3f19b405, 0xbefd0b36, 0xbe42a576, 0xbea3d8c2, 0x3e4ce4bf, 0xbd04c5db, 0x3e1b8d54, 0x3e9ed891, 0xbe7355f9, 0x3e95210b, 0x3eca002b, 0x3eb44a91, 0xbdeeec03, 0xbe03242a, 0x3e18e38e, 0xbe884453, 0xbdc3a4e4, 0x3ef13570, 0x3d66df40, 0x3ec04eec, 0x3e2ecf1a, 0xbe368069, 0xbeca8c36, 0x3e55086f, 0xbded5d8b, 0xbd55982b, 0x3e6e1529, 0x3cd13b2f, 0x3d891150, 0xbee3dc18, 0x3f422529, 0xbcd02469, 0x3f130852, 0xbf08ad1e, 0x3f265faa, 0x3eea1097, 0x3e4db57e, 0xbd343323, 0xbe64648c, 0x3e2f9fad, 0xbeaf6c52, 0xbc44d861, 0x3d9aba11, 0x3ca0bb71, 0xbef38d70, 0x3d92b75f, 0xbe9df07f, 0x3ecfd624, 0xbd9d18b4, 0x3e8b676b, 0x3e8cbb92, 0x3e4f4e76, 0x3e1e1d62, 0x3e053d82, 0xbec861cb, 0x3eaa938f, 0xbde19b20, 0x3d6fc0ed, 0xbea91f99, 0xbeb4db3b, 0x3eeae0df, 0xbe7f2282, 0xbd9b3046, 0x3eb7d9d5, 0x3ed545c5, 0x3e77c207, 0xbf025931, 0x3f0b7724, 0x3e00bc50, 0x3e143319, 0xbe7abd52, 0x3ec6418e, 0xbe4b5967, 0xbe623880, 0x3e3f4e8a, 0x3dbc235f, 0xbdec2af4, 0x3d6d1c37, 0xbe18b8aa, 0x3cf8f766, 0x3e36df08, 0xbc202169, 0xbf02a5c1, 0xbecc5ea4, 0xbf4abe23, 0xbeab6779, 0x3e199de7, 0xbf08d4a1, 0xbe2f4352, 0x3e4aa54c, 0x3dc80148, 0xbef79afa, 0x3a4060e4, 0xbe6c6bff, 0x3e4d4071, 0xbe92d30c, 0xbe5acec6, 0x3e10fd3f, 0xbe679724, 0x3f13d780, 0xbf239eb4, 0x3f006a94, 0xbe6e30a2, 0x3e684de5, 0x3a697b3a, 0x3bc7b290, 0xbea20be6, 0xbf200431, 0xbe5864a3, 0xbf3414e4, 0x3f043926, 0xbf12b272, 0x3cf7aecb, 0xbba3d424, 0x3dc1c06f, 0x3e1a0db4, 0xbe44dfd1, 0x3e2e5ad1, 0x3c36418c, 0x3e26855e, 0xbe2fa5a1, 0xbdbf95f5, 0x3ea2e10f, 0x3eeae64c, 0x3d708805, 0x3dfb102e, 0xbcc2c3e4, 0xbde79599, 0x3ddacbc3, 0xbcc8eaa2, 0xbec44acd, 0xbd0aca35, 0x3dcbced3, 0xbd184f7c, 0xbc271f44, 0xbe5f0cda, 0xbf038f70, 0xbeb325f2, 0xbe19ea8c, 0xbdd7b219, 0xba368100, 0xbd72910a, 0x3e26571c, 0xbe14bc68, 0x3e8d25d1, 0x3cbe3060, 0xbf2078da, 0xbebcfe52, 0xbf1d1294, 0xbeb355ed, 0xbac613d0, 0x3e58e46f, 0x3ba2cf68, 0x3d92504c, 0x3e897806, 0xbe21a76a, 0xbd0dccbd, 0x3d7d67c8, 0x3da86e2f, 0x3eeda070, 0x3ed107e3, 0x3d932fb9, 0xbe2b43bd, 0xbe5f7a01, 0x3db981c5, 0x3e201996, 0xbee0a104, 0xbc3c0985, 0xbed3a745, 0xbea2145d, 0x3e48a4cd, 0x3ec15fc9, 0xbc48a936, 0xbee71517, 0xbf393bfc, 0x3e8a3e0b, 0x3ee66159, 0x3ee5db96, 0x3f229738, 0xbe5ff48f, 0xbe1a8035, 0x3f05e83b, 0x3ec6a22f, 0x3f301303, 0xbe4f5c60, 0xbe0ac84a, 0xbe31b23d, 0x3ed34592, 0xbe24b8b9, 0x3e83cb11, 0xbdeb4cb9, 0x3f17bebb, 0x3f44dcd3, 0xbe0d6ad2, 0x3eb4fa92, 0xbebc98a9, 0x3e68ed44, 0xbe220598, 0xbf4932ee, 0x3f53a1da, 0xbf1c4b86, 0x3f1990c8, 0xbd3601f8, 0x3ec1085e, 0xbefd8776, 0x3e0c1ef5, 0x3f23437f, 0xbef18279, 0x3ddc9f71, 0xbf6d0107, 0x3f29cddb, 0xbf79c064, 0xbe0f88e5, 0x3ee974b9, 0xbed908e2, 0x3e29b67f, 0x3e90262a, 0x3e703cc9, 0xbf57ff31, 0x3d6dec06, 0x3e1386f9, 0x3da1fcfd, 0xbe304f21, 0xbc95fffc, 0x3e1c47b3, 0xbc1b9263, 0x3ede9f6f, 0xbe0a93c3, 0x3eb44458, 0x3d94eff6, 0xbe462e69, 0x3f29dde9, 0xbf0b7f3c, 0x3ee04cce, 0x3eb04aca, 0x3e6864f1, 0xbefa02c0, 0x3dd2b705, 0xbe7002de, 0x3f56fb90, 0x3b8cc3a0, 0xbf385b14, 0xbe7ec572, 0x3f8c6ead, 0xbf8fbd3f, 0xbeb189a0, 0x3e0eed01, 0xbf147e77, 0xbef72d1b, 0x3db24fb1, 0xbe6b1110, 0xbeba3f33, 0x3e99c935, 0x3ea18907, 0x3c856763, 0x3ec9e079, 0x3d7dedb2, 0xbed1f7b0, 0xbf4b161a, 0xbef73070, 0xbd5cb628, 0x3da5a9e0, 0xbf97bc5c, 0xbf197579, 0x3f5d9a68, 0x3cfee257, 0x3ec622a6, 0xbf706863, 0xbe98315f, 0xbf15715d, 0x3ead372d, 0x3f019ec2, 0x3eabc1f8, 0x3f25c6ec, 0x3d7a01a8, 0x3d68ba8e, 0x3f039dfc, 0x3c9593fa, 0x3ef6e07f, 0xbef54abb, 0x3d996ea9, 0x3df559e3, 0xbf78acd9, 0xbe21398d, 0x3f3fdd08, 0x3e027441, 0x3a8f0781, 0x3d868dc0, 0xbe28084d, 0xbe84dc2d, 0xbf144baa, 0xbf1687f3, 0x3ef773aa, 0xbc05f6f6, 0x3c9a8a5d, 0x3f09b557, 0x3eb1f8df, 0x3e577007, 0xbe31c654, 0xbd5e5e7b, 0xbf4b72a8, 0xbe6742b7, 0xbf3cf146, 0x3f4931d7, 0xbe9372b5, 0xbbb5ca1a, 0x3e9fde37, 0x3e584e65, 0x3dfab4f7, 0xbee05a7d, 0xbf5dbc01, 0xbea0e928, 0x3ece5882, 0x3f000e06, 0xbd1aca3b, 0xbe6f7f33, 0xbed9ea6c, 0x3e91343a, 0x3e5fdc75, 0x3f99a4bc, 0xbe1a20d1, 0x3e646b2b, 0xbeea16b3, 0x3e0105ca, 0xbec7502f, 0xbda944dc, 0xbe073457, 0xbe0c6c5f, 0x3e17f4f1, 0xbe65096c, 0x3d1253db, 0xbea6ed44, 0x3e90783f, 0xbf37c513, 0xbc4d3d34, 0xbf051e35, 0xbd216e35, 0xbf7e26a2, 0x3f1bd2a2, 0xbf4ef21a, 0xbf5b5257, 0x3e29cca2, 0x3f4f7614, 0xbe99e6d7, 0x3f0f08ef, 0x3baf6b4c, 0xbd765378, 0x3e946d95, 0xbf708c8f, 0xbefc6cab, 0x3e830615, 0xbebd82af, 0x3e2f78a1, 0xbd4482f8, 0xbdcdb398, 0xbdd4157f, 0xbf8595dd, 0x3d876249, 0xbf72178b, 0x3c2efec2, 0x3e195124, 0x3f0facf7, 0x3e2a760e, 0xbef89b2c, 0xbdbdab8b, 0x3f401dca, 0xbeff6c10, 0x3d9386a6, 0x3db7510a, 0x3f000fe4, 0xbec4a12f, 0xbf10b1de, 0xbe3be16e, 0xbf13cb56, 0x3f4fd0be, 0xbf8af272, 0xbf1ba95d, 0xbed69974, 0xbefc8755, 0xbf2b19e3, 0xbd4d258c, 0xbe28aab5, 0xbeb00853, 0x3ce07950, 0x3f8f6215, 0x3ee83c41, 0x3e217aea, 0xbf1fa2fc, 0xbf1803b1, 0x3f1551a1, 0xbf294f1e, 0x3f865445, 0xbf861982, 0x3da7fbbb, 0xbecc018c, 0xbde7ed40, 0x3f3260ea, 0xbf0cde44, 0x3e7c47fe, 0xbf204b3f, 0xbe7f4c90, 0xbead9310, 0x3f91c75d, 0xbf37a691, 0x3e3f9685, 0xbf99fc81, 0xbe1d5ddb, 0x3e8ae6ae, 0x3f8980fb, 0xbf35aa49, 0x3f97cb8f, 0xbd878d07, 0xbfb98cc3, 0xbe60c2cf, 0xbed2061a, 0x3d6f2e41, 0x3ea7b281, 0x3d005079, 0xbf948968, 0x3e443fcf, 0xbf203a9c, 0x3efa31ab, 0xbf5b732d, 0xbea036ea, 0xbe1a5aa8, 0x3e204d6c, 0x3f188890, 0x3f3b6c6a, 0x3eddcc8a, 0x3ea32f80, 0xbf640a0b, 0x3f1d65ae, 0xbf51f59d, 0x3f00280f, 0xbf8684f3, 0x3fa26ece, 0x3f05dfaf, 0xbee15db0, 0x3f5234bf, 0x3f5bdc9c, 0x3f17b036, 0xbf5d16b2, 0xbcb5ab53, 0x3d5a807f, 0xbd2a4624, 0x3ee4d5f8, 0x3ef1b4ba, 0x3e912a2d, 0x3ee5568c, 0xbdee62d1, 0x3f3c9090, 0x3f3237d7, 0xbeee2365, 0xbf54c896, 0xbe22070b, 0x3e8ffc8b, 0x3e4e6b41, 0x3f3ebcf0, 0x3e73c7a6, 0x3ee24959, 0x3b8592e8, 0x3f0d51b4, 0xbe198b35, 0x3f803703, 0xbed39968, 0x3df14926, 0xbef079e7, 0x3e585d6e, 0x3d89b9ed, 0xbefd551d, 0x3f4026c8, 0xbf8a1cf2, 0xbe56a23f, 0xbf234e95, 0x3f057409, 0xbea28059, 0xbf45e739, 0x3dc51471, 0x3cded30a, 0x3e5700ad, 0x3f9478b3, 0x3dc1a3d7, 0xc0036bbc, 0x3f97dca5, 0x4004f9c2, 0xbddc9b0f, 0x3e707904, 0xbf8b0184, 0x3ba6be70, 0xbe3ff9dd, 0x3f23b345, 0x3f86ca03, 0xbe9da6bd, 0xbe2d44f0, 0xbefbebde, 0x40325a7c, 0x3df8b0d1, 0x3ecbabb0, 0xbf26fe05, 0x3f142790, 0xbf3af17b, 0xbf3352a1, 0xbfe8305a, 0x3fd88eb2, 0xbeeb45ae, 0xbf37245e, 0x3ee217bf, 0x3f726da1, 0x3e3c27ed, 0xbecb86a4, 0xbe6ff05a, 0x3e990281, 0x3edcf4a6, 0xbc3dd430, 0xbe8353eb, 0x3ecf30f6, 0xbe8d17ff, 0x3f58843c, 0x3eb0ca9e, 0xbf145d9e, 0xbe46f786, 0x3edbc492, 0xbf24cfcb, 0x3f645a72, 0xbeea07a7, 0x3e0ffb51, 0xbc2e30f2, 0xbe689bb0, 0x3f5b1057, 0xbe020358, 0x3e15263f, 0xbebc87de, 0x3d9a045e, 0xbf2a6808, 0x3f1f85e2, 0xbf9b9236, 0x3ee1d994, 0xbf7639ce, 0xbf239665, 0xbead3281, 0x3d298795, 0x3fba1e7a, 0x3f094d73, 0xbf08156a, 0xbec839a5, 0x3d1420d7, 0x3f3c377c, 0x3f83312b, 0xbd0131a8, 0xbf1aab4e, 0xbf9f469d, 0xbea83a6c, 0xbd8de20c, 0x3f84a08e, 0xbf4d2fed, 0x3e35e273, 0xbe344236, 0x3e0920e9, 0x3c97e43f, 0x3ce6ba44, 0x3e768cc8, 0x3e10aeb7, 0x3ec1b910, 0xbc55d7a1, 0x3f09f07e, 0xbe0f0273, 0x3eb0df19, 0xbe9852c8, 0x3e8fdd9a, 0xbf274586, 0x3f0c321d, 0x3f2b3bb1, 0xbe418c35, 0xbfe16fca, 0xbeaa5419, 0x3fed3cb3, 0x3f84fe49, 0x3f24ff48, 0x3da2cb97, 0x3e94326b, 0x3ef47b22, 0xbee3d78d, 0x3d7c11cb, 0x3f14da61, 0xbf959935, 0x3f117685, 0x3f38345a, 0xbee9f124, 0x3ef93471, 0xbf07b649, 0xbe6ca222, 0xbe947efb, 0x3fa7ab04, 0x3fa77dd6, 0x3f43d193, 0x3faed132, 0x3f4fc0d1, 0x3fd93374, 0x3f108096, 0xbe086de0, 0xbf8fb796, 0xbe026381, 0x3f2c0791, 0x3ef6e886, 0xbf0984d0, 0xbeaa1bbf, 0x3e268e14, 0xbe91f939, 0x3eedceb9, 0x3ef89ee1, 0x3ed54068, 0x3fb7387a, 0x3f1c951c, 0x3f981449, 0xc0117bc5, 0x3f0c1f17, 0x3f981fde, 0xbf26a2ae, 0x3c6fda19, 0x3fefe8c0, 0xbf951dde, 0xbfb9b8b1, 0xbf238dc7, 0x407474d0, 0x3fb5154a, 0x3fd92a71, 0xbf341a96, 0x3f9016f1, 0x3f81b4cb, 0x3e2392f7, 0xbfba9716, 0x3fcac6b9, 0xbf4e4426, 0xbf4296b3, 0xbf46463e, 0x3e6e19c6, 0x4006a210, 0xbe5fc510, 0xbe207c26, 0xc0459739, 0x3e9b1fa3, 0xbf8acef9, 0x3e249cd2, 0x3e2827e1, 0x3d061bea, 0x400184e2, 0xbfe75dc8, 0xbe0ae63a, 0xbf3e69e6, 0x3fb7f290, 0x3f9dc33f, 0xbeed3b7c, 0xbfc5b185, 0x3f8dbb10, 0x3f838380, 0x3e5cf5e1, 0xbdf17145, 0xbe690185, 0xbf0f125c, 0xbf8c307f, 0x3f89c500, 0x4004538e, 0xbe57e52f, 0xbd44d28e, 0x3f0ba2b5, 0x3f842cab, 0xbfdd1786, 0xbfa5fafb, 0x40276552, 0xbeb8c014, 0xbf6beffe, 0xbefa593c, 0x3fba293a, 0xc00f51a3, 0xbf14f9cc, 0x3f0b11bc, 0xbf830158, 0xbfbc723b, 0xbe8641d2, 0xbdde3ab2, 0xc037d984, 0x3f675e07, 0x402c5b5a, 0x3e35ae67, 0x3fb2608a, 0xc01ca878, 0xbc97791c, 0xbf5a3c32, 0x3fb92aa1, 0x3e808d12, 0xbf331e5a, 0xbeae65b8, 0xbec9f663, 0x403f639e, 0xbfa72b9f, 0x3fc15adf, 0xc0133f65, 0xbe28f3ce, 0xc0277e6c, 0xbf395eb4, 0xc03b9fcd, 0x3f5ce9ea, 0xbeac6b9a, 0xc02da733, 0x3feeb434, 0x3f432cd8, 0xc01cc648, 0x3eb81e49, 0x3f90f896, 0x3f136cd2, 0x3f822731, 0x3e6101d4, 0xbf88ec01, 0xbf531ae5, 0x3faffe06, 0x4011aeec, 0xbeb3a5e7, 0x3f51a757, 0xbfac921d, 0x3d920f19, 0xbf9ab6c2, 0x3f9d30bd, 0xbf2fe97c, 0x3e10958d, 0x3dfbc9df, 0xbe98c369, 0x3fe9f83c, 0x3f240bea, 0x3f95f47c, 0xbf2ed7a0, 0xbea51665, 0xbfbe963b, 0xbe1bb479, 0xc009c0bd, 0x4006e734, 0xbf42fb94, 0xbfa9d69b, 0xbd7b57ba, 0x4024009d, 0xbe360b7e, 0xc0cd0d6d, 0xc07d8f23, 0xc00a46b7, 0xc08bffbd, 0xbeeb63f2, 0x3f10d752, 0x3f965686, 0x3fce47cb, 0xbfde0279, 0x3ffb9a49, 0xbeea276b, 0xc09bbfc5, 0x404ba395, 0x4042d93e, 0x40945659, 0xc0892018, 0xc04dbb58, 0xc047cf29, 0xbf869513, 0xbfed0876, 0xc09be4f4, 0xbfd0a3f0, 0xbf1ef657, 0xbff6f388, 0x4043f39e, 0x401da9c8, 0x3fc64033, 0xbfd88ad4, 0xc09b8836, 0x3e8adfff, 0x40311db0, 0x402d28fc, 0x40170f98, 0xbfb8a68a, 0xbf5e27aa, 0x3e377315, 0xbf7f81c1, 0x403397e6, 0xbeaf8510, 0x3eea7cc6, 0xbf96c86b, 0x3ff62f47, 0x3f0d06af, 0x3e86c3b5, 0xc07b0c43, 0x3f8b379e, 0x3faff389, 0x3fa43ed1, 0xbf3e9329, 0xbfb29137, 0x3effb282, 0xbec22e33, 0x40161db7, 0x3ffdc885, 0xbc2ec198, 0x3f92c580, 0xbf005075, 0xbe2582cc, 0xbf19afd6, 0xbe5e4df3, 0x3fbf7b7c, 0xbf3392c8, 0xbf547b7e, 0xbe65b7e5, 0x3fa99102, 0xc01961f9, 0xc0329b8b, 0xbf8b0fd9, 0xc07e8615, 0xc09c222c, 0xbf8f06da, 0xbe3fed87, 0x3e3e1661, 0x409864ad, 0xc0297353, 0x4014e52d, 0xbeafa4df, 0xc037c5cc, 0x40309c47, 0x3f86886f, 0x4039c4ab, 0xc08aa0f0, 0xc00ea3cb, 0xc092e888, 0x4014a78c, 0x3b37e28b, 0xc0e228b2, 0x3f038020, 0xbed6d0b8, 0xbc5c3607, 0xbe559230, 0x400bb525, 0x3f41fb1a, 0xc076b807, 0xbf1960d1, 0x3f8c868c, 0x404689ed, 0x405273be, 0x3f9585e8, 0xc06e59a6, 0xc08a1215, 0xbffeb751, 0xc01bddd7, 0x3fe4d7af, 0xbed06e0b, 0x3e854299, 0xbf5d2336, 0xc082a606, 0x40815da5, 0xc085d51f, 0x401bb746, 0x401a32c6, 0x4079328b, 0xbf13b207, 0x3f243104, 0xbf306a34, 0xc053bfe3, 0x3f4b3650, 0xc0891913, 0xc012da57, 0xc008f92a, 0xbfe05c26, 0x3f9a9093, 0x4053018a, 0x3f537a66, 0x4059d325, 0xc029a293, 0xbeb8f0e5, 0x407483f0, 0x401b349c, 0xc0428a06, 0xc0aca0d5, 0xc064af85, 0x3ef6acd4, 0xc0159802, 0xc099e524, 0xbf2d17a4, 0xbfe324cf, 0xbf8c47c4, 0xbeaf7e7b, 0xc0107d93, 0x3fc09c3c, 0xbf369a77, 0xc00558f3, 0x3fde72d7, 0x40724a7e, 0x3f4b573e, 0xc01cdb52, 0xc027f24d, 0xc021bffb, 0x3ee04f92, 0xbd810021, 0xc089e0b5, 0xbeafa163, 0x3f06a066, 0x3f8b1407, 0x3fa3dcb2, 0xbf9fc107, 0x3f23c558, 0xc014f941, 0x3f580060, 0xbf9d5b7d, 0x4039ae45, 0x3fcfb08d, 0xc1175808, 0xc1daad85, 0xc0ec8d0e, 0xc0abbc63, 0xc19719e8, 0xc0addab2, 0xc0f09637, 0x410b0530, 0x4016fe1b, 0xc19b1a8b, 0x415de89d, 0xc10af068, 0xc0a1c718, 0x416b7f23, 0x41456e2e, 0x40de31da, 0xc163fb28, 0xc12fb76b, 0xc1c94248, 0xc031d64b, 0xc1515400, 0xc1b56f91, 0xc11155d0, 0xc08b2dd7, 0x3f1db910, 0x4198ffe1, 0x411a31f8, 0x412f42ff, 0xc166a80e, 0xc106e2a4, 0x411d428f, 0x412be01d, 0x40f52f9c, 0xbf25fbb9, 0x3f59398b, 0x3fba1bfd, 0xbf662f5a };
Max
1
psychogenic/zephyr
tests/lib/cmsis_dsp/matrix/src/unary_f32.pat
[ "Apache-2.0" ]
import path from "path" export const getCacheDir = (root: string): string => path.join(root, `.cache`, `caches`, `gatsby-plugin-image`)
TypeScript
4
pipaliyajaydip/gatsby
packages/gatsby-plugin-image/src/node-apis/node-utils.ts
[ "MIT" ]
package com.baeldung.serenity.spring.stories; import com.baeldung.serenity.spring.steps.AdderRestSteps; import net.thucydides.core.annotations.Steps; import org.jbehave.core.annotations.Given; import org.jbehave.core.annotations.Then; import org.jbehave.core.annotations.When; /** * @author aiet */ public class AdderStory { @Steps AdderRestSteps restSteps; @Given("a number") public void givenANumber() throws Exception { restSteps.givenCurrentNumber(); } @When("I submit another number $num to adder") public void whenISubmitToAdderWithNumber(int num) { restSteps.whenAddNumber(num); } @Then("I get a sum of the numbers") public void thenIGetTheSum() { restSteps.thenSummedUp(); } }
Java
4
zeesh49/tutorials
libraries/src/test/java/com/baeldung/serenity/spring/stories/AdderStory.java
[ "MIT" ]
/// <include file="Gui.xml" path="doc/FixedText/*" /> CLASS FixedText INHERIT TextControl //PP-030915 PROTECT _dwDrawStyle AS DWORD PROTECT _dwMargin AS DWORD EXPORT lUseDrawText AS LOGIC EXPORT lDrawThemeBackground AS LOGIC /// <exclude /> METHOD __SetColors(_hDC AS PTR) AS PTR STRICT //PP-031129 IF SELF:lUseDrawText RETURN NULL_PTR ENDIF RETURN SUPER:__SetColors(_hDC) /// <exclude /> METHOD __SetText(cNewText AS STRING) AS STRING STRICT //PP-030915 IF SELF:ValidateControl() //PP-040107 SUPER:__SetText(cNewText) cCaption := cNewText InvalidateRect(hWnd,NULL_PTR,FALSE) ENDIF RETURN cNewText /// <include file="Gui.xml" path="doc/FixedText.Dispatch/*" /> METHOD Dispatch(oEvent) //PP-040509 From S Ebert LOCAL oEvt := oEvent AS @@Event LOCAL uMsg AS DWORD LOCAL sRect IS _WinRect LOCAL struPS IS _WinPaintStruct LOCAL hDc, hFont AS PTR LOCAL dwDrawStyle AS DWORD LOCAL liSSStyle AS LONGINT LOCAL hOwner AS PTR IF SELF:lUseDrawText uMsg := oEvt:uMsg SWITCH uMsg CASE WM_PAINT CASE WM_PRINTCLIENT IF uMsg == WM_PAINT hDC := BeginPaint(hwnd, @struPS) ELSE hDC := PTR(_CAST, oEvt:wParam) ENDIF GetClientRect(hWnd, @sRect) liSSStyle := GetWindowLong(hWnd, GWL_STYLE) dwDrawStyle := _dwDrawStyle IF LOGIC(_CAST, _AND(liSSStyle, SS_CENTERIMAGE)) //PP-040812 DT_VCENTER needs DT_SINGLELINE to work - see MS docs dwDrawStyle := _OR(dwDrawStyle, DT_VCENTER, DT_SINGLELINE) ENDIF IF LOGIC(_CAST, _AND(liSSStyle, SS_CENTER)) dwDrawStyle := _OR(dwDrawStyle, DT_CENTER) ENDIF IF LOGIC(_CAST, _AND(liSSStyle, SS_RIGHT)) dwDrawStyle := _OR(dwDrawStyle, DT_RIGHT) ENDIF IF LOGIC(_CAST, _AND(liSSStyle, SS_NOPREFIX)) dwDrawStyle := _OR(dwDrawStyle, DT_NOPREFIX) ENDIF // RvdH 050602 Prevent wrapping (issue [12944] ) IF LOGIC(_CAST, _AND(liSSStyle, SS_LEFTNOWORDWRAP)) dwDrawStyle := _OR(dwDrawStyle, DT_SINGLELINE) ENDIF IF oControlBackground == NULL_OBJECT //PP-040317 Issue 12691 IF IsThemeEnabled() .AND. SELF:lDrawThemeBackground DrawThemeParentBackground(hWnd, hDC, @sRect) ELSE IF _AND(GetWindowLong(hWnd, GWL_EXSTYLE), WS_EX_TRANSPARENT) = 0 // not transparent FillRect(hdc, @sRect, COLOR_3DSHADOW) ENDIF ENDIF ELSE oControlBackground:__SetBrushOrg(hdc, hwnd) FillRect(hdc, @sRect, oControlBackground:Handle()) ENDIF SetBkMode(hDc, TRANSPARENT ) IF (hFont := SendMessage(hwnd, WM_GETFONT, 0l, 0l)) != NULL_PTR SelectObject(hdc, hFont) ENDIF sRect:left += LONGINT(_dwMargin) sRect:right -= LONGINT(_dwMargin) //PP-040416 Issue 12674, 12676 Fix from S Ebert IF LOGIC(_CAST, _AND(liSSStyle, WS_DISABLED)) SetTextColor(hDC, GetSysColor(COLOR_3DHILIGHT)) sRect:left += 1 sRect:top += 1 DrawText(hDc, String2Psz(cCaption), INT(SLen(cCaption)), @sRect, dwDrawStyle) sRect:left -= 1 sRect:top -= 1 SetTextColor(hDC, GetSysColor(COLOR_3DSHADOW)) ELSE IF oTextColor != NULL_OBJECT SetTextColor(hDC, oTextColor:ColorRef) ELSE SetTextColor(hDC, GetSysColor(COLOR_WINDOWTEXT)) ENDIF ENDIF DrawText(hDc, String2Psz(cCaption), INT(SLen(cCaption)), @sRect, dwDrawStyle) IF uMsg == WM_PAINT EndPaint(hWnd, @struPS) ENDIF SELF:EventReturnValue := 0l RETURN 1l CASE WM_ERASEBKGND SELF:EventReturnValue := 0l RETURN 1l //PP-040418 Issue 12676 CASE WM_ENABLE CASE WM_SETTEXT hOwner := GetParent(hWnd) GetWindowRect(hWnd, @sRect) #ifdef __VULCAN__ MapWindowPoints(NULL_PTR, hOwner, (_winPOINT PTR) @sRect, 2) #else MapWindowPoints(NULL_PTR, hOwner, @sRect, 2) #endif InvalidateRect(hOwner, @sRect, TRUE) END SWITCH ENDIF RETURN SUPER:Dispatch(oEvt) /// <include file="Gui.xml" path="doc/FixedText.ctor/*" /> CONSTRUCTOR(oOwner, xID, oPoint, oDimension, cText, lDataAware) LOCAL cClass AS USUAL LOCAL lResID AS LOGIC //PP-030915. Text will be displayed using API DrawText(). Default style set below. // Standard styles will cause the appropriate draw style to be used. // DT_END_ELLIPSIS will put ... if text does not fit in space provided //PP-030923 Changed default value, removed SingleLiena and end ellipsis //PP-031002 Changed default draw style to DT_WORDBREAK (text was not wrapping) SELF:lUseDrawText := TRUE SELF:lDrawThemeBackground := TRUE //PP-040317. Issue 12806. Added DT_EXPANDTABS for default behaviour more like old fixed text SELF:_dwDrawStyle := _OR(DT_WORDBREAK,DT_EXPANDTABS) DEFAULT(@lDataAware, TRUE) lResID:=IsInstanceOfUsual(xID,#ResourceID) IF !lResID cClass:="Static" ENDIF SUPER(oOwner, xID, oPoint, oDimension, cClass, SS_Left, lDataAware) IF !lResID IF !IsNil(cText) cWindowName := cText SELF:Caption := cText ENDIF ENDIF RETURN /// <include file="Gui.xml" path="doc/FixedText.Margin/*" /> ASSIGN Margin (nNewValue) //PP-030915 RETURN (_dwMargin := nNewValue) /// <include file="Gui.xml" path="doc/FixedText.SetDrawStyle/*" /> METHOD SetDrawStyle(dwDrawStyle, lEnable) //PP-030915 from S Ebert EnForceNumeric(@dwDrawStyle) IF IsLogic(lEnable) IF lEnable _dwDrawStyle := _OR(_dwDrawStyle, DWORD(_CAST, dwDrawStyle)) ELSE _dwDrawStyle := _AND(_dwDrawStyle, _NOT(DWORD(_CAST, dwDrawStyle))) ENDIF ELSE _dwDrawStyle := dwDrawStyle ENDIF RETURN _dwDrawStyle /// <include file="Gui.xml" path="doc/FixedText.SetStandardStyle/*" /> METHOD SetStandardStyle(kTextStyle) LOCAL dwTempStyle, dwStyle AS DWORD LOCAL hHandle AS PTR IF !IsLong(kTextStyle) WCError{#SetStandardStyle,#FixedText,__WCSTypeError,kTextStyle,1}:Throw() ENDIF SWITCH (INT) kTextStyle CASE FT_LEFTALIGN dwTempStyle := SS_LEFT CASE FT_RIGHTALIGN dwTempStyle := SS_RIGHT CASE FT_CENTERED dwTempStyle := SS_CENTER END SWITCH hHandle := SELF:Handle() IF (hHandle != 0) .AND. IsWindow(hHandle) dwStyle := DWORD(GetWindowLong(hHandle, GWL_STYLE)) dwStyle := _AND(dwStyle, _NOT(0x00000003U)) dwStyle := _OR(dwStyle, dwTempStyle) SetWindowLong(hHandle, GWL_STYLE, LONGINT(_CAST, dwStyle)) ENDIF RETURN dwStyle END CLASS
xBase
5
orangesocks/XSharpPublic
Runtime/VOSDK/Source/VOSDK/GUI_Classes_SDK/FixedText.prg
[ "Apache-2.0" ]
-- ============================================================== -- RTL generated by Vivado(TM) HLS - High-Level Synthesis from C, C++ and OpenCL -- Version: 2020.2 -- Copyright (C) 1986-2020 Xilinx, Inc. All Rights Reserved. -- -- =========================================================== library IEEE; use IEEE.std_logic_1164.all; use IEEE.numeric_std.all; entity blackLevelCorrection is port ( ap_clk : IN STD_LOGIC; ap_rst : IN STD_LOGIC; ap_start : IN STD_LOGIC; ap_done : OUT STD_LOGIC; ap_continue : IN STD_LOGIC; ap_idle : OUT STD_LOGIC; ap_ready : OUT STD_LOGIC; p_Src_rows_dout : IN STD_LOGIC_VECTOR (15 downto 0); p_Src_rows_empty_n : IN STD_LOGIC; p_Src_rows_read : OUT STD_LOGIC; p_Src_cols_dout : IN STD_LOGIC_VECTOR (15 downto 0); p_Src_cols_empty_n : IN STD_LOGIC; p_Src_cols_read : OUT STD_LOGIC; p_Src_data_V_V_dout : IN STD_LOGIC_VECTOR (39 downto 0); p_Src_data_V_V_empty_n : IN STD_LOGIC; p_Src_data_V_V_read : OUT STD_LOGIC; p_Dst_data_V_V_din : OUT STD_LOGIC_VECTOR (39 downto 0); p_Dst_data_V_V_full_n : IN STD_LOGIC; p_Dst_data_V_V_write : OUT STD_LOGIC ); end; architecture behav of blackLevelCorrection is constant ap_const_logic_1 : STD_LOGIC := '1'; constant ap_const_logic_0 : STD_LOGIC := '0'; constant ap_ST_fsm_state1 : STD_LOGIC_VECTOR (3 downto 0) := "0001"; constant ap_ST_fsm_state2 : STD_LOGIC_VECTOR (3 downto 0) := "0010"; constant ap_ST_fsm_pp0_stage0 : STD_LOGIC_VECTOR (3 downto 0) := "0100"; constant ap_ST_fsm_state7 : STD_LOGIC_VECTOR (3 downto 0) := "1000"; constant ap_const_lv32_0 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000000000"; constant ap_const_boolean_1 : BOOLEAN := true; constant ap_const_lv32_2 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000000010"; constant ap_const_boolean_0 : BOOLEAN := false; constant ap_const_lv1_0 : STD_LOGIC_VECTOR (0 downto 0) := "0"; constant ap_const_lv32_1 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000000001"; constant ap_const_lv1_1 : STD_LOGIC_VECTOR (0 downto 0) := "1"; constant ap_const_lv30_0 : STD_LOGIC_VECTOR (29 downto 0) := "000000000000000000000000000000"; constant ap_const_lv32_F : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000001111"; constant ap_const_lv30_1 : STD_LOGIC_VECTOR (29 downto 0) := "000000000000000000000000000001"; constant ap_const_lv11_7E0 : STD_LOGIC_VECTOR (10 downto 0) := "11111100000"; constant ap_const_lv32_5 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000000101"; constant ap_const_lv32_9 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000001001"; constant ap_const_lv5_0 : STD_LOGIC_VECTOR (4 downto 0) := "00000"; constant ap_const_lv32_A : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000001010"; constant ap_const_lv32_13 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000010011"; constant ap_const_lv32_14 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000010100"; constant ap_const_lv32_1D : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000011101"; constant ap_const_lv32_19 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000011001"; constant ap_const_lv32_1E : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000011110"; constant ap_const_lv32_27 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000100111"; constant ap_const_lv32_23 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000100011"; constant ap_const_lv32_1B : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000011011"; constant ap_const_lv13_0 : STD_LOGIC_VECTOR (12 downto 0) := "0000000000000"; constant ap_const_lv32_C : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000001100"; constant ap_const_lv3_0 : STD_LOGIC_VECTOR (2 downto 0) := "000"; constant ap_const_lv10_3FF : STD_LOGIC_VECTOR (9 downto 0) := "1111111111"; constant ap_const_lv28_8422 : STD_LOGIC_VECTOR (27 downto 0) := "0000000000001000010000100010"; constant ap_const_lv32_3 : STD_LOGIC_VECTOR (31 downto 0) := "00000000000000000000000000000011"; signal ap_done_reg : STD_LOGIC := '0'; signal ap_CS_fsm : STD_LOGIC_VECTOR (3 downto 0) := "0001"; attribute fsm_encoding : string; attribute fsm_encoding of ap_CS_fsm : signal is "none"; signal ap_CS_fsm_state1 : STD_LOGIC; attribute fsm_encoding of ap_CS_fsm_state1 : signal is "none"; signal p_Src_rows_blk_n : STD_LOGIC; signal p_Src_cols_blk_n : STD_LOGIC; signal p_Src_data_V_V_blk_n : STD_LOGIC; signal ap_CS_fsm_pp0_stage0 : STD_LOGIC; attribute fsm_encoding of ap_CS_fsm_pp0_stage0 : signal is "none"; signal ap_enable_reg_pp0_iter1 : STD_LOGIC := '0'; signal ap_block_pp0_stage0 : BOOLEAN; signal icmp_ln69_reg_543 : STD_LOGIC_VECTOR (0 downto 0); signal p_Dst_data_V_V_blk_n : STD_LOGIC; signal ap_enable_reg_pp0_iter3 : STD_LOGIC := '0'; signal icmp_ln69_reg_543_pp0_iter2_reg : STD_LOGIC_VECTOR (0 downto 0); signal rw_ptr_0_i_reg_121 : STD_LOGIC_VECTOR (29 downto 0); signal p_Src_rows_read_reg_528 : STD_LOGIC_VECTOR (15 downto 0); signal ap_block_state1 : BOOLEAN; signal lshr_ln_reg_533 : STD_LOGIC_VECTOR (13 downto 0); signal mul_ln59_fu_494_p2 : STD_LOGIC_VECTOR (29 downto 0); signal mul_ln59_reg_538 : STD_LOGIC_VECTOR (29 downto 0); signal ap_CS_fsm_state2 : STD_LOGIC; attribute fsm_encoding of ap_CS_fsm_state2 : signal is "none"; signal icmp_ln69_fu_148_p2 : STD_LOGIC_VECTOR (0 downto 0); signal ap_block_state3_pp0_stage0_iter0 : BOOLEAN; signal ap_block_state4_pp0_stage0_iter1 : BOOLEAN; signal ap_block_state5_pp0_stage0_iter2 : BOOLEAN; signal ap_block_state6_pp0_stage0_iter3 : BOOLEAN; signal ap_block_pp0_stage0_11001 : BOOLEAN; signal icmp_ln69_reg_543_pp0_iter1_reg : STD_LOGIC_VECTOR (0 downto 0); signal rw_ptr_fu_153_p2 : STD_LOGIC_VECTOR (29 downto 0); signal ap_enable_reg_pp0_iter0 : STD_LOGIC := '0'; signal add_ln1354_fu_167_p2 : STD_LOGIC_VECTOR (10 downto 0); signal add_ln1354_reg_552 : STD_LOGIC_VECTOR (10 downto 0); signal icmp_ln887_fu_183_p2 : STD_LOGIC_VECTOR (0 downto 0); signal icmp_ln887_reg_557 : STD_LOGIC_VECTOR (0 downto 0); signal add_ln1354_1_fu_203_p2 : STD_LOGIC_VECTOR (10 downto 0); signal add_ln1354_1_reg_562 : STD_LOGIC_VECTOR (10 downto 0); signal icmp_ln887_32_fu_219_p2 : STD_LOGIC_VECTOR (0 downto 0); signal icmp_ln887_32_reg_567 : STD_LOGIC_VECTOR (0 downto 0); signal add_ln1354_2_fu_239_p2 : STD_LOGIC_VECTOR (10 downto 0); signal add_ln1354_2_reg_572 : STD_LOGIC_VECTOR (10 downto 0); signal icmp_ln887_33_fu_255_p2 : STD_LOGIC_VECTOR (0 downto 0); signal icmp_ln887_33_reg_577 : STD_LOGIC_VECTOR (0 downto 0); signal add_ln1354_3_fu_275_p2 : STD_LOGIC_VECTOR (10 downto 0); signal add_ln1354_3_reg_582 : STD_LOGIC_VECTOR (10 downto 0); signal icmp_ln887_34_fu_291_p2 : STD_LOGIC_VECTOR (0 downto 0); signal icmp_ln887_34_reg_587 : STD_LOGIC_VECTOR (0 downto 0); signal select_ln301_fu_336_p3 : STD_LOGIC_VECTOR (9 downto 0); signal select_ln301_reg_592 : STD_LOGIC_VECTOR (9 downto 0); signal select_ln301_12_fu_383_p3 : STD_LOGIC_VECTOR (9 downto 0); signal select_ln301_12_reg_597 : STD_LOGIC_VECTOR (9 downto 0); signal select_ln301_13_fu_430_p3 : STD_LOGIC_VECTOR (9 downto 0); signal select_ln301_13_reg_602 : STD_LOGIC_VECTOR (9 downto 0); signal select_ln301_14_fu_477_p3 : STD_LOGIC_VECTOR (9 downto 0); signal select_ln301_14_reg_607 : STD_LOGIC_VECTOR (9 downto 0); signal ap_block_pp0_stage0_subdone : BOOLEAN; signal ap_condition_pp0_exit_iter0_state3 : STD_LOGIC; signal ap_enable_reg_pp0_iter2 : STD_LOGIC := '0'; signal ap_block_pp0_stage0_01001 : BOOLEAN; signal trunc_ln647_fu_159_p1 : STD_LOGIC_VECTOR (9 downto 0); signal zext_ln215_fu_163_p1 : STD_LOGIC_VECTOR (10 downto 0); signal tmp_156_fu_173_p4 : STD_LOGIC_VECTOR (4 downto 0); signal p_Result_78_1_i_fu_189_p4 : STD_LOGIC_VECTOR (9 downto 0); signal zext_ln215_30_fu_199_p1 : STD_LOGIC_VECTOR (10 downto 0); signal tmp_158_fu_209_p4 : STD_LOGIC_VECTOR (4 downto 0); signal p_Result_78_2_i_fu_225_p4 : STD_LOGIC_VECTOR (9 downto 0); signal zext_ln215_31_fu_235_p1 : STD_LOGIC_VECTOR (10 downto 0); signal tmp_160_fu_245_p4 : STD_LOGIC_VECTOR (4 downto 0); signal p_Result_78_3_i_fu_261_p4 : STD_LOGIC_VECTOR (9 downto 0); signal zext_ln215_32_fu_271_p1 : STD_LOGIC_VECTOR (10 downto 0); signal tmp_162_fu_281_p4 : STD_LOGIC_VECTOR (4 downto 0); signal mul_ln1118_fu_500_p2 : STD_LOGIC_VECTOR (27 downto 0); signal tmp_fu_300_p4 : STD_LOGIC_VECTOR (12 downto 0); signal select_ln887_fu_309_p3 : STD_LOGIC_VECTOR (12 downto 0); signal tmp_157_fu_316_p4 : STD_LOGIC_VECTOR (2 downto 0); signal icmp_ln23_fu_326_p2 : STD_LOGIC_VECTOR (0 downto 0); signal trunc_ln301_fu_332_p1 : STD_LOGIC_VECTOR (9 downto 0); signal mul_ln1118_32_fu_507_p2 : STD_LOGIC_VECTOR (27 downto 0); signal tmp_s_fu_347_p4 : STD_LOGIC_VECTOR (12 downto 0); signal select_ln887_4_fu_356_p3 : STD_LOGIC_VECTOR (12 downto 0); signal tmp_159_fu_363_p4 : STD_LOGIC_VECTOR (2 downto 0); signal icmp_ln23_1_fu_373_p2 : STD_LOGIC_VECTOR (0 downto 0); signal trunc_ln301_12_fu_379_p1 : STD_LOGIC_VECTOR (9 downto 0); signal mul_ln1118_33_fu_514_p2 : STD_LOGIC_VECTOR (27 downto 0); signal tmp_75_fu_394_p4 : STD_LOGIC_VECTOR (12 downto 0); signal select_ln887_5_fu_403_p3 : STD_LOGIC_VECTOR (12 downto 0); signal tmp_161_fu_410_p4 : STD_LOGIC_VECTOR (2 downto 0); signal icmp_ln23_2_fu_420_p2 : STD_LOGIC_VECTOR (0 downto 0); signal trunc_ln301_13_fu_426_p1 : STD_LOGIC_VECTOR (9 downto 0); signal mul_ln1118_34_fu_521_p2 : STD_LOGIC_VECTOR (27 downto 0); signal tmp_76_fu_441_p4 : STD_LOGIC_VECTOR (12 downto 0); signal select_ln887_6_fu_450_p3 : STD_LOGIC_VECTOR (12 downto 0); signal tmp_163_fu_457_p4 : STD_LOGIC_VECTOR (2 downto 0); signal icmp_ln23_3_fu_467_p2 : STD_LOGIC_VECTOR (0 downto 0); signal trunc_ln301_14_fu_473_p1 : STD_LOGIC_VECTOR (9 downto 0); signal mul_ln59_fu_494_p0 : STD_LOGIC_VECTOR (13 downto 0); signal mul_ln59_fu_494_p1 : STD_LOGIC_VECTOR (15 downto 0); signal mul_ln1118_fu_500_p0 : STD_LOGIC_VECTOR (16 downto 0); signal mul_ln1118_fu_500_p1 : STD_LOGIC_VECTOR (10 downto 0); signal mul_ln1118_32_fu_507_p0 : STD_LOGIC_VECTOR (16 downto 0); signal mul_ln1118_32_fu_507_p1 : STD_LOGIC_VECTOR (10 downto 0); signal mul_ln1118_33_fu_514_p0 : STD_LOGIC_VECTOR (16 downto 0); signal mul_ln1118_33_fu_514_p1 : STD_LOGIC_VECTOR (10 downto 0); signal mul_ln1118_34_fu_521_p0 : STD_LOGIC_VECTOR (16 downto 0); signal mul_ln1118_34_fu_521_p1 : STD_LOGIC_VECTOR (10 downto 0); signal ap_CS_fsm_state7 : STD_LOGIC; attribute fsm_encoding of ap_CS_fsm_state7 : signal is "none"; signal ap_NS_fsm : STD_LOGIC_VECTOR (3 downto 0); signal ap_idle_pp0 : STD_LOGIC; signal ap_enable_pp0 : STD_LOGIC; signal mul_ln1118_32_fu_507_p10 : STD_LOGIC_VECTOR (27 downto 0); signal mul_ln1118_33_fu_514_p10 : STD_LOGIC_VECTOR (27 downto 0); signal mul_ln1118_34_fu_521_p10 : STD_LOGIC_VECTOR (27 downto 0); signal mul_ln1118_fu_500_p10 : STD_LOGIC_VECTOR (27 downto 0); signal mul_ln59_fu_494_p00 : STD_LOGIC_VECTOR (29 downto 0); signal mul_ln59_fu_494_p10 : STD_LOGIC_VECTOR (29 downto 0); component ISPPipeline_accelbkb IS generic ( ID : INTEGER; NUM_STAGE : INTEGER; din0_WIDTH : INTEGER; din1_WIDTH : INTEGER; dout_WIDTH : INTEGER ); port ( din0 : IN STD_LOGIC_VECTOR (13 downto 0); din1 : IN STD_LOGIC_VECTOR (15 downto 0); dout : OUT STD_LOGIC_VECTOR (29 downto 0) ); end component; component ISPPipeline_accelcud IS generic ( ID : INTEGER; NUM_STAGE : INTEGER; din0_WIDTH : INTEGER; din1_WIDTH : INTEGER; dout_WIDTH : INTEGER ); port ( din0 : IN STD_LOGIC_VECTOR (16 downto 0); din1 : IN STD_LOGIC_VECTOR (10 downto 0); dout : OUT STD_LOGIC_VECTOR (27 downto 0) ); end component; begin ISPPipeline_accelbkb_U31 : component ISPPipeline_accelbkb generic map ( ID => 1, NUM_STAGE => 1, din0_WIDTH => 14, din1_WIDTH => 16, dout_WIDTH => 30) port map ( din0 => mul_ln59_fu_494_p0, din1 => mul_ln59_fu_494_p1, dout => mul_ln59_fu_494_p2); ISPPipeline_accelcud_U32 : component ISPPipeline_accelcud generic map ( ID => 1, NUM_STAGE => 1, din0_WIDTH => 17, din1_WIDTH => 11, dout_WIDTH => 28) port map ( din0 => mul_ln1118_fu_500_p0, din1 => mul_ln1118_fu_500_p1, dout => mul_ln1118_fu_500_p2); ISPPipeline_accelcud_U33 : component ISPPipeline_accelcud generic map ( ID => 1, NUM_STAGE => 1, din0_WIDTH => 17, din1_WIDTH => 11, dout_WIDTH => 28) port map ( din0 => mul_ln1118_32_fu_507_p0, din1 => mul_ln1118_32_fu_507_p1, dout => mul_ln1118_32_fu_507_p2); ISPPipeline_accelcud_U34 : component ISPPipeline_accelcud generic map ( ID => 1, NUM_STAGE => 1, din0_WIDTH => 17, din1_WIDTH => 11, dout_WIDTH => 28) port map ( din0 => mul_ln1118_33_fu_514_p0, din1 => mul_ln1118_33_fu_514_p1, dout => mul_ln1118_33_fu_514_p2); ISPPipeline_accelcud_U35 : component ISPPipeline_accelcud generic map ( ID => 1, NUM_STAGE => 1, din0_WIDTH => 17, din1_WIDTH => 11, dout_WIDTH => 28) port map ( din0 => mul_ln1118_34_fu_521_p0, din1 => mul_ln1118_34_fu_521_p1, dout => mul_ln1118_34_fu_521_p2); ap_CS_fsm_assign_proc : process(ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (ap_rst = '1') then ap_CS_fsm <= ap_ST_fsm_state1; else ap_CS_fsm <= ap_NS_fsm; end if; end if; end process; ap_done_reg_assign_proc : process(ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (ap_rst = '1') then ap_done_reg <= ap_const_logic_0; else if ((ap_continue = ap_const_logic_1)) then ap_done_reg <= ap_const_logic_0; elsif ((ap_const_logic_1 = ap_CS_fsm_state7)) then ap_done_reg <= ap_const_logic_1; end if; end if; end if; end process; ap_enable_reg_pp0_iter0_assign_proc : process(ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (ap_rst = '1') then ap_enable_reg_pp0_iter0 <= ap_const_logic_0; else if (((ap_const_logic_1 = ap_CS_fsm_pp0_stage0) and (ap_const_logic_1 = ap_condition_pp0_exit_iter0_state3) and (ap_const_boolean_0 = ap_block_pp0_stage0_subdone))) then ap_enable_reg_pp0_iter0 <= ap_const_logic_0; elsif ((ap_const_logic_1 = ap_CS_fsm_state2)) then ap_enable_reg_pp0_iter0 <= ap_const_logic_1; end if; end if; end if; end process; ap_enable_reg_pp0_iter1_assign_proc : process(ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (ap_rst = '1') then ap_enable_reg_pp0_iter1 <= ap_const_logic_0; else if ((ap_const_boolean_0 = ap_block_pp0_stage0_subdone)) then if ((ap_const_logic_1 = ap_condition_pp0_exit_iter0_state3)) then ap_enable_reg_pp0_iter1 <= (ap_const_logic_1 xor ap_condition_pp0_exit_iter0_state3); elsif ((ap_const_boolean_1 = ap_const_boolean_1)) then ap_enable_reg_pp0_iter1 <= ap_enable_reg_pp0_iter0; end if; end if; end if; end if; end process; ap_enable_reg_pp0_iter2_assign_proc : process(ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (ap_rst = '1') then ap_enable_reg_pp0_iter2 <= ap_const_logic_0; else if ((ap_const_boolean_0 = ap_block_pp0_stage0_subdone)) then ap_enable_reg_pp0_iter2 <= ap_enable_reg_pp0_iter1; end if; end if; end if; end process; ap_enable_reg_pp0_iter3_assign_proc : process(ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (ap_rst = '1') then ap_enable_reg_pp0_iter3 <= ap_const_logic_0; else if ((ap_const_boolean_0 = ap_block_pp0_stage0_subdone)) then ap_enable_reg_pp0_iter3 <= ap_enable_reg_pp0_iter2; elsif ((ap_const_logic_1 = ap_CS_fsm_state2)) then ap_enable_reg_pp0_iter3 <= ap_const_logic_0; end if; end if; end if; end process; rw_ptr_0_i_reg_121_assign_proc : process (ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (((icmp_ln69_fu_148_p2 = ap_const_lv1_0) and (ap_const_logic_1 = ap_CS_fsm_pp0_stage0) and (ap_enable_reg_pp0_iter0 = ap_const_logic_1) and (ap_const_boolean_0 = ap_block_pp0_stage0_11001))) then rw_ptr_0_i_reg_121 <= rw_ptr_fu_153_p2; elsif ((ap_const_logic_1 = ap_CS_fsm_state2)) then rw_ptr_0_i_reg_121 <= ap_const_lv30_0; end if; end if; end process; process (ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (((icmp_ln69_reg_543 = ap_const_lv1_0) and (ap_const_logic_1 = ap_CS_fsm_pp0_stage0) and (ap_const_boolean_0 = ap_block_pp0_stage0_11001))) then add_ln1354_1_reg_562 <= add_ln1354_1_fu_203_p2; add_ln1354_2_reg_572 <= add_ln1354_2_fu_239_p2; add_ln1354_3_reg_582 <= add_ln1354_3_fu_275_p2; add_ln1354_reg_552 <= add_ln1354_fu_167_p2; icmp_ln887_32_reg_567 <= icmp_ln887_32_fu_219_p2; icmp_ln887_33_reg_577 <= icmp_ln887_33_fu_255_p2; icmp_ln887_34_reg_587 <= icmp_ln887_34_fu_291_p2; icmp_ln887_reg_557 <= icmp_ln887_fu_183_p2; end if; end if; end process; process (ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (((ap_const_logic_1 = ap_CS_fsm_pp0_stage0) and (ap_const_boolean_0 = ap_block_pp0_stage0_11001))) then icmp_ln69_reg_543 <= icmp_ln69_fu_148_p2; icmp_ln69_reg_543_pp0_iter1_reg <= icmp_ln69_reg_543; end if; end if; end process; process (ap_clk) begin if (ap_clk'event and ap_clk = '1') then if ((ap_const_boolean_0 = ap_block_pp0_stage0_11001)) then icmp_ln69_reg_543_pp0_iter2_reg <= icmp_ln69_reg_543_pp0_iter1_reg; end if; end if; end process; process (ap_clk) begin if (ap_clk'event and ap_clk = '1') then if ((not(((ap_start = ap_const_logic_0) or (p_Src_cols_empty_n = ap_const_logic_0) or (p_Src_rows_empty_n = ap_const_logic_0) or (ap_done_reg = ap_const_logic_1))) and (ap_const_logic_1 = ap_CS_fsm_state1))) then lshr_ln_reg_533 <= p_Src_cols_dout(15 downto 2); p_Src_rows_read_reg_528 <= p_Src_rows_dout; end if; end if; end process; process (ap_clk) begin if (ap_clk'event and ap_clk = '1') then if ((ap_const_logic_1 = ap_CS_fsm_state2)) then mul_ln59_reg_538 <= mul_ln59_fu_494_p2; end if; end if; end process; process (ap_clk) begin if (ap_clk'event and ap_clk = '1') then if (((icmp_ln69_reg_543_pp0_iter1_reg = ap_const_lv1_0) and (ap_const_boolean_0 = ap_block_pp0_stage0_11001))) then select_ln301_12_reg_597 <= select_ln301_12_fu_383_p3; select_ln301_13_reg_602 <= select_ln301_13_fu_430_p3; select_ln301_14_reg_607 <= select_ln301_14_fu_477_p3; select_ln301_reg_592 <= select_ln301_fu_336_p3; end if; end if; end process; ap_NS_fsm_assign_proc : process (ap_start, ap_done_reg, ap_CS_fsm, ap_CS_fsm_state1, p_Src_rows_empty_n, p_Src_cols_empty_n, ap_enable_reg_pp0_iter1, ap_enable_reg_pp0_iter3, icmp_ln69_fu_148_p2, ap_enable_reg_pp0_iter0, ap_block_pp0_stage0_subdone, ap_enable_reg_pp0_iter2) begin case ap_CS_fsm is when ap_ST_fsm_state1 => if ((not(((ap_start = ap_const_logic_0) or (p_Src_cols_empty_n = ap_const_logic_0) or (p_Src_rows_empty_n = ap_const_logic_0) or (ap_done_reg = ap_const_logic_1))) and (ap_const_logic_1 = ap_CS_fsm_state1))) then ap_NS_fsm <= ap_ST_fsm_state2; else ap_NS_fsm <= ap_ST_fsm_state1; end if; when ap_ST_fsm_state2 => ap_NS_fsm <= ap_ST_fsm_pp0_stage0; when ap_ST_fsm_pp0_stage0 => if ((not(((icmp_ln69_fu_148_p2 = ap_const_lv1_1) and (ap_enable_reg_pp0_iter1 = ap_const_logic_0) and (ap_enable_reg_pp0_iter0 = ap_const_logic_1) and (ap_const_boolean_0 = ap_block_pp0_stage0_subdone))) and not(((ap_enable_reg_pp0_iter3 = ap_const_logic_1) and (ap_enable_reg_pp0_iter2 = ap_const_logic_0) and (ap_const_boolean_0 = ap_block_pp0_stage0_subdone))))) then ap_NS_fsm <= ap_ST_fsm_pp0_stage0; elsif ((((ap_enable_reg_pp0_iter3 = ap_const_logic_1) and (ap_enable_reg_pp0_iter2 = ap_const_logic_0) and (ap_const_boolean_0 = ap_block_pp0_stage0_subdone)) or ((icmp_ln69_fu_148_p2 = ap_const_lv1_1) and (ap_enable_reg_pp0_iter1 = ap_const_logic_0) and (ap_enable_reg_pp0_iter0 = ap_const_logic_1) and (ap_const_boolean_0 = ap_block_pp0_stage0_subdone)))) then ap_NS_fsm <= ap_ST_fsm_state7; else ap_NS_fsm <= ap_ST_fsm_pp0_stage0; end if; when ap_ST_fsm_state7 => ap_NS_fsm <= ap_ST_fsm_state1; when others => ap_NS_fsm <= "XXXX"; end case; end process; add_ln1354_1_fu_203_p2 <= std_logic_vector(signed(ap_const_lv11_7E0) + signed(zext_ln215_30_fu_199_p1)); add_ln1354_2_fu_239_p2 <= std_logic_vector(signed(ap_const_lv11_7E0) + signed(zext_ln215_31_fu_235_p1)); add_ln1354_3_fu_275_p2 <= std_logic_vector(signed(ap_const_lv11_7E0) + signed(zext_ln215_32_fu_271_p1)); add_ln1354_fu_167_p2 <= std_logic_vector(signed(ap_const_lv11_7E0) + signed(zext_ln215_fu_163_p1)); ap_CS_fsm_pp0_stage0 <= ap_CS_fsm(2); ap_CS_fsm_state1 <= ap_CS_fsm(0); ap_CS_fsm_state2 <= ap_CS_fsm(1); ap_CS_fsm_state7 <= ap_CS_fsm(3); ap_block_pp0_stage0 <= not((ap_const_boolean_1 = ap_const_boolean_1)); ap_block_pp0_stage0_01001_assign_proc : process(p_Src_data_V_V_empty_n, p_Dst_data_V_V_full_n, ap_enable_reg_pp0_iter1, icmp_ln69_reg_543, ap_enable_reg_pp0_iter3, icmp_ln69_reg_543_pp0_iter2_reg) begin ap_block_pp0_stage0_01001 <= (((icmp_ln69_reg_543_pp0_iter2_reg = ap_const_lv1_0) and (p_Dst_data_V_V_full_n = ap_const_logic_0) and (ap_enable_reg_pp0_iter3 = ap_const_logic_1)) or ((icmp_ln69_reg_543 = ap_const_lv1_0) and (p_Src_data_V_V_empty_n = ap_const_logic_0) and (ap_enable_reg_pp0_iter1 = ap_const_logic_1))); end process; ap_block_pp0_stage0_11001_assign_proc : process(p_Src_data_V_V_empty_n, p_Dst_data_V_V_full_n, ap_enable_reg_pp0_iter1, icmp_ln69_reg_543, ap_enable_reg_pp0_iter3, icmp_ln69_reg_543_pp0_iter2_reg) begin ap_block_pp0_stage0_11001 <= (((icmp_ln69_reg_543_pp0_iter2_reg = ap_const_lv1_0) and (p_Dst_data_V_V_full_n = ap_const_logic_0) and (ap_enable_reg_pp0_iter3 = ap_const_logic_1)) or ((icmp_ln69_reg_543 = ap_const_lv1_0) and (p_Src_data_V_V_empty_n = ap_const_logic_0) and (ap_enable_reg_pp0_iter1 = ap_const_logic_1))); end process; ap_block_pp0_stage0_subdone_assign_proc : process(p_Src_data_V_V_empty_n, p_Dst_data_V_V_full_n, ap_enable_reg_pp0_iter1, icmp_ln69_reg_543, ap_enable_reg_pp0_iter3, icmp_ln69_reg_543_pp0_iter2_reg) begin ap_block_pp0_stage0_subdone <= (((icmp_ln69_reg_543_pp0_iter2_reg = ap_const_lv1_0) and (p_Dst_data_V_V_full_n = ap_const_logic_0) and (ap_enable_reg_pp0_iter3 = ap_const_logic_1)) or ((icmp_ln69_reg_543 = ap_const_lv1_0) and (p_Src_data_V_V_empty_n = ap_const_logic_0) and (ap_enable_reg_pp0_iter1 = ap_const_logic_1))); end process; ap_block_state1_assign_proc : process(ap_start, ap_done_reg, p_Src_rows_empty_n, p_Src_cols_empty_n) begin ap_block_state1 <= ((ap_start = ap_const_logic_0) or (p_Src_cols_empty_n = ap_const_logic_0) or (p_Src_rows_empty_n = ap_const_logic_0) or (ap_done_reg = ap_const_logic_1)); end process; ap_block_state3_pp0_stage0_iter0 <= not((ap_const_boolean_1 = ap_const_boolean_1)); ap_block_state4_pp0_stage0_iter1_assign_proc : process(p_Src_data_V_V_empty_n, icmp_ln69_reg_543) begin ap_block_state4_pp0_stage0_iter1 <= ((icmp_ln69_reg_543 = ap_const_lv1_0) and (p_Src_data_V_V_empty_n = ap_const_logic_0)); end process; ap_block_state5_pp0_stage0_iter2 <= not((ap_const_boolean_1 = ap_const_boolean_1)); ap_block_state6_pp0_stage0_iter3_assign_proc : process(p_Dst_data_V_V_full_n, icmp_ln69_reg_543_pp0_iter2_reg) begin ap_block_state6_pp0_stage0_iter3 <= ((icmp_ln69_reg_543_pp0_iter2_reg = ap_const_lv1_0) and (p_Dst_data_V_V_full_n = ap_const_logic_0)); end process; ap_condition_pp0_exit_iter0_state3_assign_proc : process(icmp_ln69_fu_148_p2) begin if ((icmp_ln69_fu_148_p2 = ap_const_lv1_1)) then ap_condition_pp0_exit_iter0_state3 <= ap_const_logic_1; else ap_condition_pp0_exit_iter0_state3 <= ap_const_logic_0; end if; end process; ap_done_assign_proc : process(ap_done_reg, ap_CS_fsm_state7) begin if ((ap_const_logic_1 = ap_CS_fsm_state7)) then ap_done <= ap_const_logic_1; else ap_done <= ap_done_reg; end if; end process; ap_enable_pp0 <= (ap_idle_pp0 xor ap_const_logic_1); ap_idle_assign_proc : process(ap_start, ap_CS_fsm_state1) begin if (((ap_start = ap_const_logic_0) and (ap_const_logic_1 = ap_CS_fsm_state1))) then ap_idle <= ap_const_logic_1; else ap_idle <= ap_const_logic_0; end if; end process; ap_idle_pp0_assign_proc : process(ap_enable_reg_pp0_iter1, ap_enable_reg_pp0_iter3, ap_enable_reg_pp0_iter0, ap_enable_reg_pp0_iter2) begin if (((ap_enable_reg_pp0_iter3 = ap_const_logic_0) and (ap_enable_reg_pp0_iter1 = ap_const_logic_0) and (ap_enable_reg_pp0_iter2 = ap_const_logic_0) and (ap_enable_reg_pp0_iter0 = ap_const_logic_0))) then ap_idle_pp0 <= ap_const_logic_1; else ap_idle_pp0 <= ap_const_logic_0; end if; end process; ap_ready_assign_proc : process(ap_CS_fsm_state7) begin if ((ap_const_logic_1 = ap_CS_fsm_state7)) then ap_ready <= ap_const_logic_1; else ap_ready <= ap_const_logic_0; end if; end process; icmp_ln23_1_fu_373_p2 <= "0" when (tmp_159_fu_363_p4 = ap_const_lv3_0) else "1"; icmp_ln23_2_fu_420_p2 <= "0" when (tmp_161_fu_410_p4 = ap_const_lv3_0) else "1"; icmp_ln23_3_fu_467_p2 <= "0" when (tmp_163_fu_457_p4 = ap_const_lv3_0) else "1"; icmp_ln23_fu_326_p2 <= "0" when (tmp_157_fu_316_p4 = ap_const_lv3_0) else "1"; icmp_ln69_fu_148_p2 <= "1" when (rw_ptr_0_i_reg_121 = mul_ln59_reg_538) else "0"; icmp_ln887_32_fu_219_p2 <= "1" when (tmp_158_fu_209_p4 = ap_const_lv5_0) else "0"; icmp_ln887_33_fu_255_p2 <= "1" when (tmp_160_fu_245_p4 = ap_const_lv5_0) else "0"; icmp_ln887_34_fu_291_p2 <= "1" when (tmp_162_fu_281_p4 = ap_const_lv5_0) else "0"; icmp_ln887_fu_183_p2 <= "1" when (tmp_156_fu_173_p4 = ap_const_lv5_0) else "0"; mul_ln1118_32_fu_507_p0 <= ap_const_lv28_8422(17 - 1 downto 0); mul_ln1118_32_fu_507_p1 <= mul_ln1118_32_fu_507_p10(11 - 1 downto 0); mul_ln1118_32_fu_507_p10 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(add_ln1354_1_reg_562),28)); mul_ln1118_33_fu_514_p0 <= ap_const_lv28_8422(17 - 1 downto 0); mul_ln1118_33_fu_514_p1 <= mul_ln1118_33_fu_514_p10(11 - 1 downto 0); mul_ln1118_33_fu_514_p10 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(add_ln1354_2_reg_572),28)); mul_ln1118_34_fu_521_p0 <= ap_const_lv28_8422(17 - 1 downto 0); mul_ln1118_34_fu_521_p1 <= mul_ln1118_34_fu_521_p10(11 - 1 downto 0); mul_ln1118_34_fu_521_p10 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(add_ln1354_3_reg_582),28)); mul_ln1118_fu_500_p0 <= ap_const_lv28_8422(17 - 1 downto 0); mul_ln1118_fu_500_p1 <= mul_ln1118_fu_500_p10(11 - 1 downto 0); mul_ln1118_fu_500_p10 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(add_ln1354_reg_552),28)); mul_ln59_fu_494_p0 <= mul_ln59_fu_494_p00(14 - 1 downto 0); mul_ln59_fu_494_p00 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(lshr_ln_reg_533),30)); mul_ln59_fu_494_p1 <= mul_ln59_fu_494_p10(16 - 1 downto 0); mul_ln59_fu_494_p10 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(p_Src_rows_read_reg_528),30)); p_Dst_data_V_V_blk_n_assign_proc : process(p_Dst_data_V_V_full_n, ap_block_pp0_stage0, ap_enable_reg_pp0_iter3, icmp_ln69_reg_543_pp0_iter2_reg) begin if (((icmp_ln69_reg_543_pp0_iter2_reg = ap_const_lv1_0) and (ap_const_boolean_0 = ap_block_pp0_stage0) and (ap_enable_reg_pp0_iter3 = ap_const_logic_1))) then p_Dst_data_V_V_blk_n <= p_Dst_data_V_V_full_n; else p_Dst_data_V_V_blk_n <= ap_const_logic_1; end if; end process; p_Dst_data_V_V_din <= (((select_ln301_14_reg_607 & select_ln301_13_reg_602) & select_ln301_12_reg_597) & select_ln301_reg_592); p_Dst_data_V_V_write_assign_proc : process(ap_enable_reg_pp0_iter3, icmp_ln69_reg_543_pp0_iter2_reg, ap_block_pp0_stage0_11001) begin if (((icmp_ln69_reg_543_pp0_iter2_reg = ap_const_lv1_0) and (ap_enable_reg_pp0_iter3 = ap_const_logic_1) and (ap_const_boolean_0 = ap_block_pp0_stage0_11001))) then p_Dst_data_V_V_write <= ap_const_logic_1; else p_Dst_data_V_V_write <= ap_const_logic_0; end if; end process; p_Result_78_1_i_fu_189_p4 <= p_Src_data_V_V_dout(19 downto 10); p_Result_78_2_i_fu_225_p4 <= p_Src_data_V_V_dout(29 downto 20); p_Result_78_3_i_fu_261_p4 <= p_Src_data_V_V_dout(39 downto 30); p_Src_cols_blk_n_assign_proc : process(ap_start, ap_done_reg, ap_CS_fsm_state1, p_Src_cols_empty_n) begin if ((not(((ap_start = ap_const_logic_0) or (ap_done_reg = ap_const_logic_1))) and (ap_const_logic_1 = ap_CS_fsm_state1))) then p_Src_cols_blk_n <= p_Src_cols_empty_n; else p_Src_cols_blk_n <= ap_const_logic_1; end if; end process; p_Src_cols_read_assign_proc : process(ap_start, ap_done_reg, ap_CS_fsm_state1, p_Src_rows_empty_n, p_Src_cols_empty_n) begin if ((not(((ap_start = ap_const_logic_0) or (p_Src_cols_empty_n = ap_const_logic_0) or (p_Src_rows_empty_n = ap_const_logic_0) or (ap_done_reg = ap_const_logic_1))) and (ap_const_logic_1 = ap_CS_fsm_state1))) then p_Src_cols_read <= ap_const_logic_1; else p_Src_cols_read <= ap_const_logic_0; end if; end process; p_Src_data_V_V_blk_n_assign_proc : process(p_Src_data_V_V_empty_n, ap_CS_fsm_pp0_stage0, ap_enable_reg_pp0_iter1, ap_block_pp0_stage0, icmp_ln69_reg_543) begin if (((icmp_ln69_reg_543 = ap_const_lv1_0) and (ap_const_boolean_0 = ap_block_pp0_stage0) and (ap_enable_reg_pp0_iter1 = ap_const_logic_1) and (ap_const_logic_1 = ap_CS_fsm_pp0_stage0))) then p_Src_data_V_V_blk_n <= p_Src_data_V_V_empty_n; else p_Src_data_V_V_blk_n <= ap_const_logic_1; end if; end process; p_Src_data_V_V_read_assign_proc : process(ap_CS_fsm_pp0_stage0, ap_enable_reg_pp0_iter1, icmp_ln69_reg_543, ap_block_pp0_stage0_11001) begin if (((icmp_ln69_reg_543 = ap_const_lv1_0) and (ap_enable_reg_pp0_iter1 = ap_const_logic_1) and (ap_const_logic_1 = ap_CS_fsm_pp0_stage0) and (ap_const_boolean_0 = ap_block_pp0_stage0_11001))) then p_Src_data_V_V_read <= ap_const_logic_1; else p_Src_data_V_V_read <= ap_const_logic_0; end if; end process; p_Src_rows_blk_n_assign_proc : process(ap_start, ap_done_reg, ap_CS_fsm_state1, p_Src_rows_empty_n) begin if ((not(((ap_start = ap_const_logic_0) or (ap_done_reg = ap_const_logic_1))) and (ap_const_logic_1 = ap_CS_fsm_state1))) then p_Src_rows_blk_n <= p_Src_rows_empty_n; else p_Src_rows_blk_n <= ap_const_logic_1; end if; end process; p_Src_rows_read_assign_proc : process(ap_start, ap_done_reg, ap_CS_fsm_state1, p_Src_rows_empty_n, p_Src_cols_empty_n) begin if ((not(((ap_start = ap_const_logic_0) or (p_Src_cols_empty_n = ap_const_logic_0) or (p_Src_rows_empty_n = ap_const_logic_0) or (ap_done_reg = ap_const_logic_1))) and (ap_const_logic_1 = ap_CS_fsm_state1))) then p_Src_rows_read <= ap_const_logic_1; else p_Src_rows_read <= ap_const_logic_0; end if; end process; rw_ptr_fu_153_p2 <= std_logic_vector(unsigned(rw_ptr_0_i_reg_121) + unsigned(ap_const_lv30_1)); select_ln301_12_fu_383_p3 <= ap_const_lv10_3FF when (icmp_ln23_1_fu_373_p2(0) = '1') else trunc_ln301_12_fu_379_p1; select_ln301_13_fu_430_p3 <= ap_const_lv10_3FF when (icmp_ln23_2_fu_420_p2(0) = '1') else trunc_ln301_13_fu_426_p1; select_ln301_14_fu_477_p3 <= ap_const_lv10_3FF when (icmp_ln23_3_fu_467_p2(0) = '1') else trunc_ln301_14_fu_473_p1; select_ln301_fu_336_p3 <= ap_const_lv10_3FF when (icmp_ln23_fu_326_p2(0) = '1') else trunc_ln301_fu_332_p1; select_ln887_4_fu_356_p3 <= ap_const_lv13_0 when (icmp_ln887_32_reg_567(0) = '1') else tmp_s_fu_347_p4; select_ln887_5_fu_403_p3 <= ap_const_lv13_0 when (icmp_ln887_33_reg_577(0) = '1') else tmp_75_fu_394_p4; select_ln887_6_fu_450_p3 <= ap_const_lv13_0 when (icmp_ln887_34_reg_587(0) = '1') else tmp_76_fu_441_p4; select_ln887_fu_309_p3 <= ap_const_lv13_0 when (icmp_ln887_reg_557(0) = '1') else tmp_fu_300_p4; tmp_156_fu_173_p4 <= p_Src_data_V_V_dout(9 downto 5); tmp_157_fu_316_p4 <= select_ln887_fu_309_p3(12 downto 10); tmp_158_fu_209_p4 <= p_Src_data_V_V_dout(19 downto 15); tmp_159_fu_363_p4 <= select_ln887_4_fu_356_p3(12 downto 10); tmp_160_fu_245_p4 <= p_Src_data_V_V_dout(29 downto 25); tmp_161_fu_410_p4 <= select_ln887_5_fu_403_p3(12 downto 10); tmp_162_fu_281_p4 <= p_Src_data_V_V_dout(39 downto 35); tmp_163_fu_457_p4 <= select_ln887_6_fu_450_p3(12 downto 10); tmp_75_fu_394_p4 <= mul_ln1118_33_fu_514_p2(27 downto 15); tmp_76_fu_441_p4 <= mul_ln1118_34_fu_521_p2(27 downto 15); tmp_fu_300_p4 <= mul_ln1118_fu_500_p2(27 downto 15); tmp_s_fu_347_p4 <= mul_ln1118_32_fu_507_p2(27 downto 15); trunc_ln301_12_fu_379_p1 <= select_ln887_4_fu_356_p3(10 - 1 downto 0); trunc_ln301_13_fu_426_p1 <= select_ln887_5_fu_403_p3(10 - 1 downto 0); trunc_ln301_14_fu_473_p1 <= select_ln887_6_fu_450_p3(10 - 1 downto 0); trunc_ln301_fu_332_p1 <= select_ln887_fu_309_p3(10 - 1 downto 0); trunc_ln647_fu_159_p1 <= p_Src_data_V_V_dout(10 - 1 downto 0); zext_ln215_30_fu_199_p1 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(p_Result_78_1_i_fu_189_p4),11)); zext_ln215_31_fu_235_p1 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(p_Result_78_2_i_fu_225_p4),11)); zext_ln215_32_fu_271_p1 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(p_Result_78_3_i_fu_261_p4),11)); zext_ln215_fu_163_p1 <= std_logic_vector(IEEE.numeric_std.resize(unsigned(trunc_ln647_fu_159_p1),11)); end behav;
VHDL
1
hito0512/Vitis-AI
Whole-App-Acceleration/apps/resnet50/build_flow/DPUCVDX8G_vck190/vck190_platform/hw/source/ip/isppipeline_accel/hdl/vhdl/blackLevelCorrection.vhd
[ "Apache-2.0" ]
<div> <header></header> <hr class="quick-offline"> <section class="quick-offline"> <h3>LOOKS LIKE<BR>YOU'RE OFFLINE</h3> </section> <section class="quick-offline"> <p class="gray justify">you can create & edit new documents, and open offline-documents, but features that require internet will be disabled. your documents will be sync'ed once cryptee's re-connected.<br><span class="small">if you're certain you're online, disable your content-blockers, try again, and reach out to our support if you continue to see this message.</span></p> </section> <hr class="quick-recent-docs"> <section class="quick-recent-docs"> <h3>RECENT<br>DOCUMENTS</h3> </section> <section class="quick-recent-docs" id="blank-editor-recents"></section> <hr class="quick-tips"> <section class="quick-tips"> <h3>TIPS</h3> </section> <section class="quick-tips" id="getting-started"> <p onclick="showTip('tips-getting-started');">welcome! click here to learn how to use<br class="hidden-tiny"> cryptee documents in less than 2 mins!</p> </section> </div>
Kit
2
pws1453/web-client
source/imports/app/docs-blank-editor.kit
[ "MIT" ]
.Alert { padding: .5rem margin: 1rem border-radius: 0.25rem background-color: white &.info { color: white background-color: #5352ED } &.positive { background-color: #2ED573 } &.negative { background-color: #FF4757 } &.warning { background-color: #FFA502 } }
Stylus
3
jreynard-code/docz
examples/stylus/src/components/Alert.styl
[ "MIT" ]
# Copyright (C) 2003-2009, Parrot Foundation. .sub _ext_main print "in ext.pir\n" new P2, 'Undef' print P2 .begin_return .end_return .end # Local Variables: # mode: pir # fill-column: 100 # End: # vim: expandtab shiftwidth=4 ft=pir:
Parrot Internal Representation
3
winnit-myself/Wifie
src/dynpmc/ext.pir
[ "Artistic-2.0" ]
fn f1<'a>(x: u8, y: &'a ...) {} //~^ ERROR C-variadic type `...` may not be nested inside another type fn f2<'a>(x: u8, y: Vec<&'a ...>) {} //~^ ERROR C-variadic type `...` may not be nested inside another type fn main() { let _recovery_witness: () = 0; //~ ERROR mismatched types }
Rust
0
Eric-Arellano/rust
src/test/ui/parser/variadic-ffi-nested-syntactic-fail.rs
[ "ECL-2.0", "Apache-2.0", "MIT-0", "MIT" ]
--- title: Icons page-header: Icons menu: base.icons --- {% assign icons-brand = '' | split: ',' %} {% assign icons-core = '' | split: ',' %} {% for icon in site.data.icons %} {% assign i = icon[0] %} {% if i contains 'brand-' %} {% assign icons-brand = icons-brand | push: i %} {% else %} {% assign icons-core = icons-core | push: i %} {% endif %} {% endfor %} <div class="alert alert-primary mb-3"> All icons come from the Tabler Icons set and are MIT-licensed. Visit <a href="https://tabler-icons.io" target="_blank">tabler-icons.io</a>, download the icons you need in SVG, PNG or React and use them in your favourite design tools. </div> <div class="row row-cards"> <div class="col-12"> {% include cards/icons.html title="Tabler icons" icons=icons-core %} </div> <div class="col-12"> {% include cards/icons.html title="Brand icons" icons=icons-brand %} </div> </div> <script> var getClosest = function (elem, selector) { for (; elem && elem !== document; elem = elem.parentNode) { if (elem.matches(selector)) return elem } return null }; (function () { const elements = document.querySelectorAll('[data-toggle-icon]') if (elements.length) { elements.forEach(function (element) { element.addEventListener('click', function (e) { var icon = this.dataset.toggleIcon, svg = this.querySelector('svg').outerHTML, iconCode = this.dataset.iconSvg, editor = getClosest(this, '[data-icon-preview]') editor.querySelector('[data-icon-preview-icon]').innerHTML = svg editor.querySelector('[data-icon-preview-title]').innerText = icon editor.querySelector('[data-icon-preview-code]').innerHTML = iconCode.trim() e.preventDefault() return false }) }) } })() </script>
HTML
4
muhginanjar/tabler
src/pages/icons.html
[ "MIT" ]
lexer grammar t001lexer; options { language = JavaScript; } ZERO: '0';
G-code
3
DanielMabadeje/Artificial-Intelligence-Deep-Learning-Machine-Learning-Tutorials
java/java2py/antlr-3.1.3/runtime/JavaScript/tests/functional/t001lexer.g
[ "Apache-2.0" ]
FROM envoyproxy/envoy-dev:latest COPY ./envoy.yaml /etc/envoy.yaml RUN chmod go+r /etc/envoy.yaml CMD ["/usr/local/bin/envoy", "-c /etc/envoy.yaml"]
Dockerfile
4
dcillera/envoy
examples/udp/Dockerfile
[ "Apache-2.0" ]
#@namespace scala io.buoyant.router.thriftscala service PingService { string ping( 1: string msg ) }
Thrift
3
mahak/linkerd
router/thrift-idl/src/main/thrift/ping.thrift
[ "Apache-2.0" ]
[STAThread]; FUNCTION Start() AS INT LOCAL oXApp AS XApp TRY oXApp := XApp{} oXApp:Start() CATCH oException AS Exception ErrorDialog(oException) END TRY RETURN 0 CLASS XApp INHERIT App METHOD Start() local oDlg as OrderDialog oDlg := OrderDialog{} oDlg:Show() return nil END CLASS
xBase
3
orangesocks/XSharpPublic
Tests/TypedSDK/Pizza/Start.prg
[ "Apache-2.0" ]
require 'digest-rails/opal_lib/sub_controller' require 'digest-rails/opal_lib/quick_html_table' require 'axle/opal_lib/digest_helpers' require 'digest-rails/opal_lib/hot_helpers' require 'digest-rails/opal_lib/hot_like_table' require 'digest-rails/opal_lib/table' class DigestSectionController < SubController def initialize( base_section_controller, key, digest, template, render_target=nil ) super(base_section_controller,key) @table = Table.new(template) @table.add_digest(digest) end def render @table.render end end
Opal
3
bcavileer/digest-rails
app/assets/javascripts/digest-rails/opal_lib/hold/digest_section_controller.js.opal
[ "MIT" ]
import system.io def lifted_test : reader_t ℕ (state_t ℕ io) unit := do 0 ← read, -- unlifted 1 ← get, -- transparently lifted through reader_t put 2, 2 ← get, modify (+1), 3 ← get, put 4 <|> put 5, 4 ← get, -- left branch wins modify (+1) >> monad_fail.fail "" <|> modify (+2), 6 ← get, -- an outer state_t makes the state backtrack pure () #eval (lifted_test.run 0).run 1 def infer_test {m} [monad_state ℕ m] [monad m] : m ℕ := do n ← get, -- can infer σ through class inference pure n.succ def adapt_test : reader_t ℕ (state_t (ℕ × ℕ) io) unit := do -- zoom in on second elem adapt_state (λ p, (prod.snd p, prod.fst p)) -- note: type of `p` is not known yet (λ m n, (n, m)) -- note: inner monad type must be known -- note: the reader_t layer is not discarded (read >>= put : reader_t ℕ (state_t ℕ io) punit), (1, 0) ← get, -- zoom out 3 ← adapt_state (λ p, ((p, 3), p)) (λ q _, q.1) ((do q ← get, pure q.2) : reader_t ℕ (state_t ((ℕ × ℕ) × ℕ) io) ℕ), pure () #eval (adapt_test.run 0).run (1, 2) def bistate_test : state_t ℕ (state_t bool io) unit := do 0 ← get, -- outer state_t wins -- can always lift manually tt ← monad_lift (get : state_t bool io bool), pure () #eval (bistate_test.run 0).run tt
Lean
5
ericrbg/lean
tests/lean/run/state.lean
[ "Apache-2.0" ]
static X: usize = unsafe { core::ptr::null::<usize>() as usize }; //~^ ERROR: pointers cannot be cast to integers during const eval fn main() { assert_eq!(X, 0); }
Rust
3
mbc-git/rust
src/test/ui/consts/issue-17458.rs
[ "ECL-2.0", "Apache-2.0", "MIT-0", "MIT" ]
== Efficient JSON-compatible binary format: "Smile" == "Smile" is codename for an efficient JSON-compatible binary data format, initially developed by Jackson JSON processor project team. For design on "Project Smile", which implements support for this format, see [[SmileFormatDesignGoals | Smile Format design goals]] page. For usage with [[JacksonHome | Jackson]] processor, see [[JacksonForSmile | Jackson SMILE usage]] page. This page covers current data format specification; which is planned to eventually be standardized through a format process (most likely as IETF RFC). === Document version === Version: 1.0.2 (27-Jul-2011) Last updated: 2011-07-27 * 2011-07-27: Fixed 2 erroneous references to "5 MSB" which should be "5 LSB" (thanks Pierre!) * 2011-07-15: Formatting improvements; add a note about recommended MIME Type for Smile encoded data * 2011-02-16: Fix a minor typo in section 2.3 ("Short Unicode names"); range 0xF8 - 0xFE is NOT used for encoding * 2010-09-12: Mark as 1.0.0; add some future plan notes. * 2010-08-26: Rearrange token byte values to make better use of 0xF8 - 0xFF area for framing. * 2010-08-20: Remove references to initially planned in-frame compression; add one more header flag, extend version info to 4 bits === External Considerations === ==== MIME Type ==== There is no formal or official MIME type registered for Smile content, but the current best practice (as of July 2011) is to use: {{{application/x-jackson-smile}}} since this is used by multiple existing projects. === High-level format === At high level, content encoded using this format consists of a simple sequence of sections, each of which consists of: * A 4-byte header (described below) that can be used to identify content that uses the format, as well as its version and any per-section configuration settings there may be. * Sequence (0 to N) of tokens that are properly nested (all start-object/start-array tokens are matched with equivalent close tokens) within sequence. * Optional end marker, 0xFF, can be used: if encountered, it will be consider same as end-of-stream. This is added as a convenience feature to help with framing. Header consists of: * Constant byte #0: 0x3A (ASCII ':') * Constant byte #1: 0x29 (ASCII ')') * Constant byte #2: 0x0A (ASCII linefeed, '\n') * Variable byte #3, consisting of bits: * Bits 4-7 (4 MSB): 4-bit version number; 0x00 for current version (note: it is possible that some bits may be reused if necessary) * Bits 3: Reserved * Bit 2 (mask 0x04) Whether '''raw binary''' (unescaped 8-bit) values may be present in content * Bit 1 (mask 0x02): Whether '''shared String value''' checking was enabled during encoding -- if header missing, default value of "false" must be assumed for decoding (meaning parser need not store decoded String values for back referencing) * Bit 0 (mask 0x01): Whether '''shared property name''' checking was enabled during encoding -- if header missing, default value of "true" must be assumed for decoding (meaning parser MUST store seen property names for possible back references) And basically first 2 bytes form simple smiley and 3rd byte is a (Unix) linefeed: this to make command-line-tool based identification simple: choice of bytes is not significant beyond visual appearance. Fourth byte contains minimal versioning marker and additional configuration bits. === Low-level Format === Each section described above consist of set of tokens that forms properly nested JSON value. Tokens are used in two basic modes: value mode (in which tokens are "value tokens"), and property-name mode ("key tokens"). Property-name mode is used within JSON Object values to denote property names, and alternates between name / value tokens. Token lengths vary from a single byte (most common) to 9 bytes. In each case, first byte determines type, and additional bytes are used if and as indicated by the type byte. Type byte value ranges overlap between value and key tokens; but not all type bytes are legal in both modes. Use of certain byte values is limited: * Values 0xFD through 0xFF are not used as token type markers, key markers, or in values; with exception of optional raw binary data (which can contain any values). Instead they are used to: * 0xFF can be used as logical data end marker; this use is intended to be compatible with Web Sockets usage * 0xFE is reserved for future use, and not used for anything currently. * 0XFD is used as type marker for raw binary data, to allow for uniquely identifying raw binary data sections (note too that content header will have to explicitly enable support; without this content can not contain raw binary data sections) * 0xFC is used as String end-marker (similar to use of zero byte with C strings) for long Strings that do not use length prefix. * Since number encodings never use values 0xC0 - 0xFF, and UTF-8 does not use values 0xF8 - 0xFF, these are only uses within Smile format (except for possible raw binary data) * Values 0xF8 - 0xFB are only used for type tokens START_ARRAY, END_ARRAY, START_OBJECT and END_OBJECT (respectively); they are not used for String or numeric values of field names and can otherwise only occur in raw binary data sections. * Value 0x00 has no specific handling (can occur in variable length numeric values, as UTF-8 null characters and so on). * 0x3A is not used as type byte in either mode, since it is the first byte of 4-byte header sequence, and may thus be encountered after value tokens (and although it can not occur within key mode, it is reserved to increase chances of detecting corrupted content) * Value can occur within many kinds of values (vints, String values) ==== Tokens: general ==== Some general notes on tokens: * Strings are encoded using standard UTF-8 encoding; length is indicated either by using: * 6-bit byte length prefix, for lengths 1 - 63 (0 is not used since there is separate token) * End-of-String marker byte (0xFE) for variable length Strings. * Integral numeric values up to Java long (64-bit) are handled using VInts: * sequence of 1 to 10 bytes that can represent all 64-bit numbers. * VInts are big endian, meaning that most-significant bytes come first * All bytes except for the last one have their MSB clear, leaving 7 data bits * Last byte has its MSB (bit #7) set, but bit #6 NOT set (to avoid possibility of collision with 0xFF), leaving 6 data bits. * This means that 2 byte VInt has 13 data bits, for example; and minimum number of bytes to represent a Java long (64 bits) is 10; 9 bytes would give 62 bits (8 * 7 + 6). * Signed VInt values are handled using "zigzag" encoding, where sign bit is shifted to be the least-significant bit, and value is shifted left by one (i.e. multiply by one). * Unsigned VInts (used as length indicators) do NOT use zigzag encoding. * Length indicators are done using VInts (for binary data, unlimited length ("big") integer/decimal values) * All length indicators define _actual_ length of data; not possibly encoded length (in case of "safe" encoding, encoded data is longer, and that length can be calculated from payload data length) * Floating point values (IEEE 32 and 64-bit) are encoded using fixed-length big-endian encoding (7 bits used to avoid use of reserved bytes like 0xFF): * Data is "right-aligned", meaning padding is prepended to the first byte (and its MSB). * "Big" decimal/integer values use "safe" binary encoding * "Safe" binary encoding simply uses 7 LSB: data is left aligned (i.e. any padding of the last byte is in its rightmost, least-significant, bits). ==== Tokens: value mode ==== Value is the default mode for tokens for main-level ("root") output context and JSON Array context. It is also used between JSON Object property name tokens (see next section). Conceptually tokens are divided in 8 classes, class defined by 3 MSB of the first byte: * 0x00 - 0x1F: Short Shared Value String reference (single byte) * 0x20 - 0x3F: Simple literals, numbers * 0x40 - 0x5F: Tiny ASCII (1 - 32 bytes == chars) * 0x60 - 0x7F: Short ASCII (33 - 64 bytes == chars) * 0x80 - 0x9F: Tiny Unicode (2 - 33 bytes; <= 33 characters) * 0xA0 - 0xBF: Short Unicode (34 - 64 bytes; <= 64 characters) * 0xC0 - 0xDF: Small integers (single byte) * 0xE0 - 0xFF: Binary / Long text / structure markers (0xF8 - 0xFF is reserved and/or unused) These token class are are described below. ==== Token class: Short Shared Value String reference ==== Prefix: 0x00; covers byte values 0x01 - 0x1F (0x00 not used as value type token) * 5 LSB used to get reference value of 1 - 31; 0 is not used with this version (reserved for future use) * Back reference resolved as explained in section 4. ==== Token class: Simple literals, numbers ==== Prefix: 0x20; covers byte values 0x20 - 0x3F, although not all values are used * Literals (simple, non-structured) * 0x20: "" (empty String) * 0x21: null * 0x22 / 0x23: false / true * Numbers: * 0x24 - 0x27 Integral numbers; 2 {{{LSB}}} (0x03) contain subtype * 0x0 - 32-bit integer; zigzag encoded, 1 - 5 data bytes * 0x1 - 64-bit integer; zigzag encoded, 5 - 10 data bytes * 0x2 - {{{BigInteger}}} * Encoded as token indicator followed by 7-bit escaped binary (with Unsigned VInt (no-zigzag encoding) as length indicator) that represent magnitude value (byte array) * 0x3 - reserved for future use * 0x28 - 0x2B floating point numbers * 2 LSB (0x03) contain subtype * 0x00: 32-bit float * 0x01: 64-bit double * 0x02: {{{BigDecimal}}} * Encoded as token indicator followed by zigzag encoded scale (32-bit), followed by 7-bit escaped binary (with Unsigned VInt (no-zigzag encoding) as length indicator) that represent magnitude value (byte array) of integral part. * 0x3 - reserved for future use * Reserved for future use, avoided * 0x2C - 0x2F reserved for future use (non-overlapping with keys) * 0x30 - 0x3F overlapping with key mode and/or header (0x3A) Rest of the possible values are reserved for future use and not used currently. ==== Token classes: Tiny ASCII, Small ASCII ==== Prefixes: 0x40 / 0x60; covers all byte values between 0x40 and 0x7F. * 0x40 - 0x5F: Tiny ASCII * String with specified length; all bytes in ASCII range. * 5 LSB used to indicate lengths from 1 to 32 (bytes == chars) * 0x60 - 0x7F: Small ASCII * String with specified length; all bytes in ASCII range * 5 LSB used to indicate lengths from 33 to 64 (bytes == chars) ==== Token classes: Tiny Unicode, Small Unicode ==== Prefixes: 0x80 / 0xA0; covers all byte values between 0x80 and 0xBF; except that 0x80 is not encodable (since there is no 1 byte long multi-byte-character String) * 0x80 - 0x9F * String with specified length; bytes NOT guaranteed to be in ASCII range * 5 LSB used to indicate _byte_ lengths from 2 to 33 (with character length possibly less due to multi-byte characters) * Length 1 can not be expressed, since only ASCII characters have single byte encoding (which means it should be encoded with "Tiny ASCII") * 0xA0 - 0xBF * 5 LSB used to indicate _byte_ lengths from 34 to 65 (with character length possibly less due to multi-byte characters) ==== Token class: Small integers ==== Prefix: 0xC0; covers byte values 0xC0 - 0xDF, all values used. * Zigzag encoded * 5 LSB used to get values from -16 to +15 ==== Token class: Misc; binary / text / structure markers ==== Prefix: 0xE0; covers byte values 0xE0 - 0xF7: 0xF8 - 0xFF not used. Note, too, that value 0x36 could be viewed as "real" END_OBJECT; but is not included here since it is only encountered in "key mode" (where you either get a key name, or END_OBJECT marker) This class is further divided in 8 sub-section, using value of bits #2, #3 and #4 (0x1C) as follows: * 0xE0: Long (variable length) ASCII text * 2 LSB (0x03): reserved for future use * 0xE4: Long (variable length) Unicode text * 2 LSB (0x03): reserved for future use * 0xE8: Shared String reference, long * 2 LSB (0x03): used as 2 MSB of index * followed by byte used as 8 LSB of index * Resulting 10-bit index used as is; values 0-30 are not to be used (instead, short reference must be used) * Back references are ONLY made to "short" and "tiny" Ascii/Unicode Strings, so generator and parser only need to keep track of such Strings (but all of them!) * 0xEC: Binary, 7-bit encoded * 2 LSB (0x03): reserved for future use * followed by VInt length indicator, then data in 7/8 encoding (only 7 LSB of each byte used; 8 such bytes are used to encode 7 "raw" bytes) * 0xF8 - 0xFB: Structural markers * 0xF8: START_ARRAY * 0xF9: END_ARRAY * 0xFA: START_OBJECT * 0xFB: reserved in token mode (but is END_OBJECT in key mode) -- this just because object end marker comes as alternative to property name. * 0xFC: Used as end-of-String marker * 0xFD: Binary (raw) * followed by VInt length indicator, then raw data * 0xFE: reserved for future use * 0xFF: end-of-content marker (not used in content itself) ==== Tokens: key mode ==== Key mode tokens are only used within JSON Object values; if so, they alternate between value tokens (first a key token; followed by either single-value value token or multi-token JSON Object/Array value). A single token denotes end of JSON Object value; all the other tokens are used for expressing JSON Object property name. Most tokens are single byte: exceptions are 2-byte "long shared String" token, and variable-length "long Unicode String" tokens. Byte ranges are divides in 4 main sections (64 byte values each): * 0x00 - 0x3F: miscellaneous * 0x00 - 0x1F: not used, reserved for future versions * 0x20: Special constant name "" (empty String) * 0x21 - 0x2F: reserved for future use (unused for now to reduce overlap between values) * 0x30 - 0x33: "Long" shared key name reference (2 byte token); 2 LSBs of the first byte are used as 2 MSB of 10-bit reference (up to 1024) values to a shared name: second byte used for 8 LSB. * Note: combined values of 0 through 63 are reserved (since there is more optimal representation) -- encoder is not to produce these values, and decoder should check that these are not encountered. Future format versions may choose to use these for specific use. * 0x34: Long (not-yet-shared) Unicode name. Variable-length String; token byte is followed by 64 or more bytes, followed by end-of-String marker byte. * Note: encoding of Strings shorter than 64 bytes is NOT allowed: if such sequence is detected it will constitute an error * 0x35 - 0x39: not used, reserved for future versions * 0x3A: Not used; would be part of header sequence (which is NOT allowed in key mode!) * 0x3B - 0x3F: not used, reserved for future versions * 0x40 - 0x7F: "Short" shared key name reference; names 0 through 63. * 0x80 - 0xBF: Short Ascii names * 0x80 - 0xBF: names consisting of 1 - 64 bytes, all of which represent UTF-8 Ascii characters (MSB not set) -- special case to potentially allow faster decoding * 0xC0 - 0xF7: Short Unicode names * 0xC0 - 0xF7: names consisting of 2 - 57 bytes that can potentially contain UTF-8 multi-byte sequences: encoders are NOT required to guarantee there is one, but for efficiency reasons are strongly recommended to check. * 0xF8 - 0xFA: reserved (avoid overlap with START/END_ARRAY, START_OBJECT) * 0xFB: END_OBJECT marker * 0xFC - 0xFF: reserved for framing, not used in key mode === Resolved Shared String references === Shared Strings refer to already encoded/decoded key names or value strings. The method used for indicating which of "already seen" String values to use is designed to allow for: * Efficient encoding AND decoding (without necessarily favoring either) * To allow keeping only limited amount of buffering (of already handled names) by both encoder and decoder; this is especially beneficial to avoid unnecessary overhead for cases where there are few back references (mostly or completely unique values) Mechanism for resolving value string references differs from that used for key name references, so two are explained separately below. ==== Shared value Strings ==== Support for shared value Strings is optional, in that generator can choose to either check for shareable value Strings or omit the checks. Format header will indicate which option generator chose: if header is missing, default value of "false" (no checks done for shared value Strings; no back-references exist in encoded content) must be assumed. One basic limitation is the encoded byte length of a String value that can be referenced is 64 bytes or less. Longer Strings can not be referenced. This is done as a performance optimization, as longer Strings are less likely to be shareable; and also because equality checks for longer Strings are most costly. As a result, parser only should keep references for eligible Strings during parsing. Reference length allowed by format is 10 bits, which means that encoder can replace references to most recent 1024 potentially shareable (referenceable) value Strings. For both encoding (writing) and decoding (parsing), same basic sliding-window algorithm is used: when a potentially eligible String value is to be written, generator can check whether it has already written such a String, and has retained reference. If so, reference value (between 0 and 1023) can be written instead of String value. If no such String has been written (as per generator's knowledge -- it is not required to even check this), value is to be written. If its encoded length indicates that it is indeeed shareable (which can not be known before writing, as check is based on byte length, not character length!), decoder is to add value into its shareable String buffer -- as long as buffer size does not exceed that of 1024 values. If it already has 1024 values, it MUST clear out buffer and start from first entry. This means that reference values are NOT relative back references, but rather offsets from beginning of reference buffer. Similarly, parser has to keep track of decoded short (byte length <= 64 bytes) Strings seen so far, and have buffer of up to 1024 such values; clearing out buffer when it fills is done same way as during content generation. Any shared string value references are resolved against this buffer. Note: when a shared String is written or parsed, no entry is added to the shared value buffer (since one must already be in it) ==== Shared key name Strings ==== Support for shared property names is optional, in that generator can choose to either check for shareable property names or omit the checks. Format header will indicate which option generator chose: if header is missing, default value of "trues" (checking done for shared property names is made, and encoded content MAY contain back-references to share names) must be assumed. Shared key resolution is done same way as shared String value resolution, but buffers used are separate. Buffer sizes are same, 1024. === Future improvement ideas === '''NOTE''': version 1.0 will '''NOT''' support any of features presented in this section; they are documented as ideas for future work. ==== In-frame compression? ==== Although there were initial plans to allow in-frame (in-content) compression for individual values, it was decided that support would not be added for initial version, mostly since it was felt that compression of the whole document typically yields better results. For some use cases this may not be true, however; especially when semi-random access is desired. Since enough type bits were left reserved for binary and long-text types, support may be added for future versions. ==== Longer length-prefixed data? ==== Given that encoders may be able to determine byte-length for value strings longer than 64 bytes (current limit for "short" strings), it might make sense to add value types with 2-byte prefix (or maybe just 1-byte prefix and additional length information after first fixed 64 bytes, since that allows output at constant location. Performance measurements should be made to ensure that such an option would improve performance as that would be main expected benefit. ==== Pre-defined shared values (back-refs) ==== For messages with little redundancy, but small set of always used names (from schema), it would be possible to do something similar to what deflate/gzip allows: defining "pre-amble", to allow back-references to pre-defined set of names and text values. For example, it would be possible to specify 64 names and/or shared string values for both serializer and deserializer to allow back-references to this pre-defined set of names and/or string values. This would both improve performance and reduce size of content.
Creole
4
GerHobbelt/libsmile
doc/SmileFormatSpec.creole
[ "Apache-2.0" ]
require "benchmark" MY_PI = 3.1415 my-pi1() -> MY_PI 'inline my-pi2() -> MY_PI Benchmark.ips 4, 10, (x) ~> begins x.report ~> z1 = 1.0 for x in 1..100000 z1 = z1 * MY_PI + MY_PI x.report ~> z2 = 1.0 for x in 1..100000 z2 = z2 * my-pi1 + my-pi1 x.report ~> z3 = 1.0 for x in 1..100000 z3 = z3 * my-pi2 + my-pi2
Ox
3
ozra/onyx-lang
spec/onyx-alpha-throwups/constant-vs-proxied-constant.ox
[ "Apache-2.0" ]
' ********** Copyright 2019 Roku, Inc. All Rights Reserved. ********** function RAFX_getSSAIPluginBase(params as object) as Object daisdk = {} daisdk.init = function(params=invalid as object) as Void m.createImpl() m.createEventCallbacks() m.updateLocale() m.logLevel = 0 if invalid <> params if invalid <> params["logLevel"] then m.logLevel = params.logLevel end if end function daisdk.requestStream = function(requestObj as object) as object status = {} ret = m.impl.requestPreplay(requestObj) if ret <> invalid and ret["error"] <> invalid status["error"] = ret["error"] end if return status end function daisdk.getStreamInfo = function() as object return m.impl.getStreamInfo() end function daisdk.setStreamInfo = function(streamInfo as object) as object return m.impl.setStreamInfo(streamInfo) end function daisdk.enableAds = function(params as object) as void m.impl.enableAds(params) end function daisdk.addEventListener = function(event as string, callback as function) as Void m.eventCallbacks.addEventListener(event, callback) end function daisdk.onMessage = function(msg as object) as object return m.impl.onMessage(msg) end function daisdk.onSeekSnap = function(seekRequest as object) as double return m.impl.onSeekSnap(seekRequest) end function daisdk.isInteractive = function(curAd as object) as boolean return m.impl.isInteractive(curAd) end function daisdk.command = function(params as object) as object return m.impl.command(params) end function daisdk.createEventCallbacks = function() as object obj = m.createDAIObject("eventCallbacks") obj.callbacks = {} return obj end function evtcll = {} evtcll.addEventListener = function(event as string, callback as function) as Void m.callbacks[event] = callback end function evtcll.doCall = function(event as string, adInfo as object) as Void if invalid <> m.callbacks[event] func = getglobalaa()["callFunctionInGlobalNamespace"] func(m.callbacks[event], adInfo) end if end function evtcll.errCall = function(errid as integer, errInfo as string) as Void ERROR = m.sdk.CreateError() ERROR.id = errid ERROR.info = errInfo dd = getglobalaa()["callFunctionInGlobalNamespace"] dd(m.sdk.AdEvent.ERROR, ERROR) end function daisdk["eventCallbacks"] = evtcll daisdk.createImpl = function() as object obj = m.createDAIObject("impl") obj.strmURL = "" obj.prplyInfo = invalid obj.wrpdPlayer = invalid obj.loader = invalid obj.streamManager = invalid obj.useStitched = true adIface = m.getRokuAds() return obj end function impl = {} impl.setStreamInfo = function(streamInfo as object) as void end function impl.parsePrplyInfo = function() as object m.sdk.log("parsePrplyInfo() To be overridden") return {adOpportunities:0, adBreaks:[]} end function impl.enableAds = function(params as object) as Void ei = false if type(params["player"]) = "roAssociativeArray" player = params["player"] if player.doesexist("port") and player.doesexist("sgnode") ei = true end if m.wrpdPlayer = player end if m.useStitched = (invalid = params["useStitched"] or params["useStitched"]) if m.useStitched adIface = m.sdk.getRokuAds() adIface.stitchedAdsInit([]) end if if not ei m.sdk.log("Warning: Invalid object for interactive ads.") return end if m.setRAFAdPods(params["ads"]) end function impl.setRAFAdPods = function(adbreaksGiven = invalid as object) as Void adBreaks = adbreaksGiven if invalid = adbreaksGiven pTimer = createObject("roTimespan") parseResults = m.parsePrplyInfo() adBreaks = parseResults.adBreaks if m.loader["xResponseTime"] <> invalid m.sdk.logToRAF("ValidResponse", {ads:adBreaks,slots:parseResults.adOpportunities,responseTime:m.loader.xResponseTime, parseTime:pTimer.totalMilliseconds(), url:m.loader.strmURL, adServers:invalid}) m.loader.xResponseTime = invalid end if end if if 0 < adBreaks.count() if m.useStitched adIface = m.sdk.getRokuAds() adIface.stitchedAdsInit(adBreaks) m.sdk.log(["impl.setRAFAdPods() adBreaks set to RAF. renderTime: ",adBreaks[0].renderTime.tostr()], 5) end if m.sdk.eventCallbacks.doCall(m.sdk.AdEvent.PODS, {event:m.sdk.AdEvent.PODS, adPods:adBreaks}) end if if invalid = m.streamManager then m.streamManager = m.sdk.createStreamManager() m.streamManager.createTimeToEventMap(adBreaks) end function impl.onMetadata = function(msg as object) as void end function impl.onPosition = function (msg as object) as void m.streamManager.onPosition(msg) end function impl.onMessage = function(msg as object) as object msgType = m.sdk.getMsgType(msg, m.wrpdPlayer) if msgType = m.sdk.msgType.FINISHED m.sdk.log("All video is completed - full result") m.sdk.eventCallbacks.doCall(m.sdk.AdEvent.STREAM_END, {}) else if msgType = m.sdk.msgType.METADATA m.onMetadata(msg) else if msgType = m.sdk.msgType.POSITION m.onPosition(msg) end if curAd = m.msgToRAF(msg) if invalid <> m.prplyInfo and msgType = m.sdk.msgType.POSITION m.streamManager.onMessageVOD(msg, curAd) m.onMessageLIVE(msg, curAd) else if msgType = m.sdk.msgType.FINISHED m.streamManager.deinit() end if return curAd end function impl.onSeekSnap = function(seekRequest as object) as double if invalid = m.prplyInfo or m.prplyInfo.strmType <> m.sdk.StreamType.VOD or invalid = m.streamManager then return seekRequest.time return m.streamManager.onSeekSnap(seekRequest) end function impl.onMessageLIVE = function(msg as object, curAd as object) as void if m.sdk.StreamType.LIVE <> m.prplyInfo.strmType then return end function impl.msgToRAF = function(msg as object) as object if m.useStitched adIface = m.sdk.getRokuAds() return adIface.stitchedAdHandledEvent(msg, m.wrpdPlayer) end if return invalid end function impl.requestPreplay = function(requestObj as object) as object ret = {} if invalid = m.loader m.loader = m.createLoader(requestObj.type) end if jsn = m.loader.requestPreplay(requestObj) if type(jsn) = "roAssociativeArray" m.prplyInfo = jsn else if jsn <> "" m.prplyInfo = parsejson(jsn) end if if m.prplyInfo <> invalid if requestObj["testAds"] <> invalid ads = ReadAsciiFile(requestObj.testAds) if ads <> invalid m.prplyInfo.ads = parsejson(ads) else m.sdk.log(requestObj.testAds + " may not be valid JSON") end if end if m.prplyInfo["strmType"] = requestObj.type m.loader.composePingURL(m.prplyInfo) else m.prplyInfo = {strmType:requestObj.type} ret["error"] = "No valid response from "+requestObj.url end if return ret end function impl.createLoader = function(live_or_vod as string) as object m.loader = m.sdk.createLoader(live_or_vod) return m.loader end function impl.isInteractive = function(curAd as object) as boolean return m.streamManager.isInteractive(curAd) end function impl.command = function(params as object) as object ret = invalid if m.useStitched and "exitPod" = params.cmd ret = m.exitPod(params) end if return ret end function impl.exitPod = function(params as object) as object curAd = invalid strmMgr = m.streamManager if invalid <> params.curAd and invalid <> strmMgr.currentAdBreak and not strmMgr.isInteractive(params.curAd) msg = { getData : function() return 0 end function getField : function() as string return "keypressed" end function isRemoteKeyPressed : function() As Boolean return true end function GetIndex : function() As Integer return 0 end function IsScreenClosed : function() As Boolean return false end function } curAd = m.msgToRAF(msg) adIface = m.sdk.getRokuAds() adIface.stitchedAdsInit([]) end if return curAd end function daisdk["impl"] = impl daisdk.createLoader = function(live_or_vod as string) as object obj = m.createDAIObject(live_or_vod+"loader") obj.strmURL = "" return obj end function liveloader = {} liveloader.ping = function(param as dynamic) as void m.sdk.log("liveloader.ping() To be overridden") end function daisdk["liveloader"] = liveloader vodloader = {} vodloader.ping = function(param as dynamic) as void end function vodloader.composePingURL = function(prplyInfo as object) as void end function vodloader.requestPreplay = function(requestObj as object) as dynamic if not m.isValidString(m.strmURL) m.strmURL = requestObj.url end if return m.getJSON(requestObj) end function vodloader.isValidString = function(ue as dynamic) as boolean ve = type(ue) if ve = "roString" or ve = "String" return len(ue) > 0 end if return false end function vodloader.getJSON = function(params as object) as string xfer = m.sdk.createUrlXfer(m.sdk.httpsRegex.isMatch(params.url)) xfer.setUrl(params.url) port = createObject("roMessagePort") xfer.setPort(port) xfer.addHeader("Accept", "application/json, application/xml") if invalid <> params["headers"] for each item in params["headers"].items() xfer.addHeader(item.key, item.value) end for end if xTimer = createObject("roTimespan") if params["retry"] <> invalid then m.sdk.logToRAF("Request", params) xTimer.mark() if invalid <> params["body"] xfer.asyncPostFromString(params.body) else xfer.asyncGetToString() end if timeoutsec = 4 if invalid <> params["timeoutsec"] timeoutsec = params["timeoutsec"] end if msg = port.waitMessage(timeoutsec*1000) xTime = xTimer.totalMilliseconds() if msg = invalid m.sdk.logToRAF("ErrorResponse", {error: "no response", time: xTime, label: "Primary", url:params.url}) m.sdk.log("Msg is invalid. Possible timeout on loading URL") return "" else if type(msg) = "roUrlEvent" wi = msg.getResponseCode() if 200 <> wi and 201 <> wi m.sdk.logToRAF("EmptyResponse", {error: msg.getfailurereason(), time: xTime, label: "Primary", url:params.url}) m.sdk.log(["Transfer url: ", params.url, " failed, got code: ", wi.tostr(), " reason: ", msg.getfailurereason()]) return "" end if if params["retry"] <> invalid then m.xResponseTime = xTime return msg.getString() else m.sdk.log("Unknown Ad Request Event: " + type(msg)) end if return "" end function daisdk["vodloader"] = vodloader daisdk.createStreamManager = function() as object obj = m.createDAIObject("streamManager") obj.adTimeToEventMap = invalid obj.adTimeToBreakMap = invalid obj.adTimeToBeginEnd = invalid obj.crrntPosSec = -1 obj.lastPosSec = -1 obj.whenAdBreakStart = -1 obj.currentAdBreak = invalid return obj end function strmMgr = {} strmMgr.addEventToEvtMap = function(timeToEvtMap as object, timeKey as string, evtStr as string) as void if timeToEvtMap[timeKey] = invalid timeToEvtMap[timeKey] = [evtStr] else eExist = false for each e in timeToEvtMap[timeKey] eExist = eExist or (e = evtStr) end for if not eExist timeToEvtMap[timeKey].push(evtStr) end if end if end function strmMgr.createTimeToEventMap = function(adBreaks as object) as Void if adBreaks = invalid m.adTimeToEventMap = invalid m.adTimeToBreakMap = invalid m.adTimeToBeginEnd = invalid return end if timeToEvtMap = {} timeToBreakMap = {} timeToBeginEnd = [] for each adBreak in adBreaks brkBegin = int(adBreak.renderTime) brkTimeKey = brkBegin.tostr() timeToEvtMap[brkTimeKey] = [m.sdk.AdEvent.POD_START] timeToBreakMap[brkTimeKey] = adBreak adRenderTime = adBreak.renderTime for each rAd in adBreak.ads hasCompleteEvent = false for each evt in rAd.tracking if invalid <> evt["time"] timeKey = int(evt.time).tostr() m.addEventToEvtMap(timeToEvtMap, timeKey, evt.event) if m.sdk.AdEvent.COMPLETE = evt.event hasCompleteEvent = true end if end if end for adRenderTime = adRenderTime + rAd.duration if not hasCompleteEvent and 0 < rAd.tracking.count() and 0 < rAd.duration timeKey = int(adRenderTime - 0.5).tostr() m.addEventToEvtMap(timeToEvtMap, timeKey, m.sdk.AdEvent.COMPLETE) end if end for brkEnd = int(adBreak.renderTime+adBreak.duration) timeKey = brkEnd.tostr() m.appendBreakEnd(timeToEvtMap, timeKey) timeToBeginEnd.push({"begin":brkBegin, "end":brkEnd, "renderSequence":adBreak.renderSequence}) end for if not timeToEvtMap.isEmpty() m.adTimeToEventMap = timeToEvtMap m.lastEvents = {} end if if not timeToBreakMap.isEmpty() then m.adTimeToBreakMap = timeToBreakMap if 0 < timeToBeginEnd.count() then timeToBeginEnd.sortby("begin") m.adTimeToBeginEnd = timeToBeginEnd end if end function strmMgr.appendBreakEnd = function(timeToEvtMap as object, timeKey as string) as object if timeToEvtMap[timeKey] = invalid timeToEvtMap[timeKey] = [m.sdk.AdEvent.POD_END] else timeToEvtMap[timeKey].push(m.sdk.AdEvent.POD_END) end if return timeToEvtMap end function strmMgr.findBreak = function(possec as float) as object snapbrk = invalid if invalid = m.adTimeToBeginEnd then return snapbrk for each brk in m.adTimeToBeginEnd if brk.begin <= possec and possec <= brk.end snapbrk = brk exit for end if if possec < brk.end then exit for end for return snapbrk end function strmMgr.onSeekSnap = function(seekRequest as object) as double if invalid = m.adTimeToBeginEnd then return seekRequest.time if m.sdk.SnapTo.NEXTPOD = seekRequest.snapto for each brk in m.adTimeToBeginEnd if seekRequest.time < brk.begin then exit for else if m.crrntPosSec <= brk.begin and brk.begin <= seekRequest.time snap2begin = brk.begin - 1 if snap2begin < 0 then snap2begin = 0 return snap2begin end if end for else snapbrk = m.findBreak(seekRequest.time) if snapbrk = invalid then return seekRequest.time snap2begin = snapbrk.begin - 1 if snap2begin < 0 then snap2begin = 0 if "postroll" = snapbrk.renderSequence then return snap2begin if m.sdk.SnapTo.BEGIN = seekRequest.snapto return snap2begin else if m.sdk.SnapTo.END = seekRequest.snapto return snapbrk.end + 1 end if end if return seekRequest.time end function strmMgr.onPosition = function(msg as object) as Void m.sdk.log(["onPosition() msg position: ",msg.getData().tostr()], 89) if m.currentAdBreak = invalid or m.currentAdBreak.duration = invalid return end if posSec = msg.getData() if 0 <= m.whenAdBreakStart and m.whenAdBreakStart + m.currentAdBreak.duration + 2 < posSec m.cleanupAdBreakInfo(false) end if end function strmMgr.onMessageVOD = function(msg as object, curAd as object) as Void posSec = msg.getData() if posSec = m.crrntPosSec or posSec = m.lastPosSec return end if m.lastPosSec = m.crrntPosSec m.crrntPosSec = posSec if m.crrntPosSec <> m.lastPosSec + 1 m.handlePosition(posSec - 1, curAd) end if m.handlePosition(posSec, curAd) end function strmMgr.handlePosition = function(sec as integer, curAd as object) as Void if m.adTimeToEventMap <> invalid timeKey = sec.tostr() if m.adTimeToEventMap[timeKey] <> invalid for each adEvent in m.adTimeToEventMap[timeKey] if adEvent <> invalid m.handleAdEvent(adEvent, sec, curAd) end if end for end if end if end function strmMgr.fillAdBreakInfo = function(sec as integer, curAd as object) as Void m.whenAdBreakStart = sec if invalid <> m.adTimeToBreakMap adBreak = m.adTimeToBreakMap[sec.tostr()] if invalid <> adBreak m.currentAdBreak = adBreak end if end if end function strmMgr.updateAdBreakEvents = function(adBreak as object, triggered as boolean) as void adBreak.viewed = triggered for each ad in adBreak.ads for each evnt in ad.tracking evnt.triggered = triggered end for end for for each evnt in adBreak.tracking evnt.triggered = triggered end for end function strmMgr.cleanupAdBreakInfo = function(triggered=false as boolean) as void if m.currentAdBreak <> invalid m.updateAdBreakEvents(m.currentAdBreak, triggered) end if m.whenAdBreakStart = -1 m.currentAdBreak = invalid m.lastEvents = {} end function strmMgr.deinit = function() as void m.adTimeToEventMap = invalid m.adTimeToBreakMap = invalid m.adTimeToBeginEnd = invalid m.currentAdBreak = invalid m.crrntPosSec = -1 m.lastPosSec = -1 m.whenAdBreakStart = -1 end function strmMgr.handleAdEvent = function(adEvent as string, sec as integer, curAd as object) as Void if adEvent = m.sdk.AdEvent.POD_START m.fillAdBreakInfo(sec, curAd) if m.lastEvents[adEvent] <> sec m.lastEvents = {} end if else if invalid = m.currentAdBreak ab = m.findBreak(sec) if invalid <> ab pastSec = ab.begin while pastsec < sec m.handlePosition(pastSec, curAd) pastSec += 1 end while end if end if end if if m.lastEvents[adEvent] <> sec adInfo = {position:sec, event:adEvent} if adEvent = m.sdk.AdEvent.POD_START then adInfo["adPod"] = m.currentAdBreak m.sdk.eventCallbacks.doCall(adEvent, adInfo) m.lastEvents[adEvent] = sec end if end function strmMgr.pastLastAdBreak = function(posSec as integer) as boolean return invalid = m.adTimeToBeginEnd or m.adTimeToBeginEnd.peek()["end"] < posSec end function strmMgr.cancelPod = function (curAd as object) as object ret = {canceled: false} if invalid <> m.currentAdBreak and 0 < m.crrntPosSec ab = m.currentAdBreak if not m.isInteractive(curAd) shortdur = (m.crrntPosSec-1) - ab.renderTime if 0 < shortdur ab.duration = shortdur m.cleanupAdBreakInfo(true) ret["canceled"] = true end if end if end if return ret end function strmMgr.isInteractive = function(curAd as object) as boolean if invalid <> curAd and invalid <> curAd["adindex"] and invalid <> m.currentAdBreak ad = m.currentAdBreak.ads[curAd["adindex"] - 1] strmFmt = ad["streamFormat"] return "iroll" = strmFmt or "brightline" = left(strmFmt,10) end if return false end function daisdk["streamManager"] = strmMgr daisdk.setCertificate = function(certificateRef as string) as Void m.certificate = certificateRef end function daisdk.getCertificate = function() as string if m.certificate = invalid return "common:/certs/ca-bundle.crt" end if return m.certificate end function daisdk.getMsgType = function(msg as object, player as object) as integer nodeId = player.sgnode.id if "roSGNodeEvent" = type(msg) xg = msg.getField() if nodeId = msg.getNode() if xg = "position" return m.msgType.POSITION else if xg.left(13) = "timedMetaData" return m.msgType.METADATA else if xg = "state" if msg.getData() = "finished" return m.msgType.FINISHED end if end if else if xg = "keypressed" return m.msgType.KEYEVENT end if end if end if return m.msgType.UNKNOWN end function daisdk.createUrlXfer = function(ishttps as boolean) as object xfer = createObject("roUrlTransfer") if ishttps xfer.setCertificatesfile(m.getCertificate()) xfer.initClientCertificates() end if xfer.addHeader("Accept-Language", m.locale.Accept_Language) xfer.addHeader("Content-Language", m.locale.Content_Language) return xfer end function daisdk.setTrackingTime = function(timeOffset as float, rAd as object) as void duration = rAd.duration for each evt in rAd.tracking if evt.event = m.AdEvent.IMPRESSION evt.time = 0.0 + timeOffset else if evt.event = m.AdEvent.FIRST_QUARTILE evt.time = duration * 0.25 + timeOffset else if evt.event = m.AdEvent.MIDPOINT evt.time = duration * 0.5 + timeOffset else if evt.event = m.AdEvent.THIRD_QUARTILE evt.time = duration * 0.75 + timeOffset else if evt.event = m.AdEvent.COMPLETE evt.time = duration + timeOffset end if end for end function daisdk.getValidStr = function(obj as object) as string if invalid <> obj and invalid <> getInterface(obj, "ifString") return obj.trim() else return "" end if end function daisdk.httpsRegex = createObject("roRegEx", "^https", "") daisdk.getRokuAds = function() as object return roku_ads() end function daisdk.logToRAF = function(btype as string, obj as object) as object m.getRokuAds().util.fireBeacon(btype, obj) end function daisdk.createDAIObject = function(objName as string) as object if type(m[objName]) = "roAssociativeArray" m[objName]["sdk"] = m end if return m[objName] end function daisdk.updateLocale = function() m.locale.Content_Language = createObject("roDeviceInfo").getCurrentLocale().replace("_","-") end function daisdk.ErrorEvent = { ERROR : "0", COULD_NOT_LOAD_STREAM: "1000", STREAM_API_KEY_NOT_VALID: "1002", BAD_STREAM_REQUEST: "1003" INVALID_RESPONSE: "1004" } daisdk.AdEvent = { PODS: "PodsFound" POD_START: "PodStart" START: "Start", IMPRESSION: "Impression", CREATIVE_VIEW: "creativeView", FIRST_QUARTILE: "FirstQuartile", MIDPOINT: "Midpoint", THIRD_QUARTILE: "ThirdQuartile", COMPLETE: "Complete", POD_END: "PodComplete", STREAM_END: "StreamEnd", ACCEPT_INVITATION: "AcceptInvitation", ERROR: "Error" } daisdk.msgType = { UNKNOWN: 0, POSITION: 1, METADATA: 2, FINISHED: 3, KEYEVENT: 4, } daisdk.version = { ver: "0.1.0" } daisdk.locale = { Accept_Language: "en-US,en-GB,es-ES,fr-CA,de-DE", Content_Language: "en-US" } daisdk.StreamType = { LIVE: "live", VOD: "vod" } daisdk.SnapTo = { NEXTPOD: "nextpod", BEGIN: "begin", END: "end" } daisdk.CreateError = function() as object ERROR = createObject("roAssociativeArray") ERROR.id = "" ERROR.info = "" ERROR.type = "error" return ERROR end function daisdk.log = function(x, logLevel=-1 as integer) as void if logLevel < m.logLevel dtm = ["SDK (", createObject("roDateTime").toISOString().split("T")[1], "): "].join("") if "roArray" = type(x) print dtm; x.join("") else print dtm; x end if end if end function getglobalaa()["callFunctionInGlobalNamespace"] = function(dd as function, ue as object) as Void dd(ue) end function return daisdk end function function RAFX_getYospaceAdapter(params as dynamic) as Object rafssai = RAFX_getSSAIPluginBase(params) impl = rafssai["impl"] impl.getStreamInfo = function() as object return m.prplyInfo end function impl.enableAdsBase = impl.enableAds impl.enableAds = function(params as object) as void m.enableAdsBase(params) if m.useStitched and m.prplyInfo.strmType = m.sdk.StreamType.LIVE player = params["player"] selected = false skeys = [] for each key in player.sgnode.timedMetaDataSelectionKeys if key = m.streamManager.YMID or key = "*" selected = true exit for else skeys.push(key) end if end for if not selected skeys.push("*") player.sgnode.timedMetaDataSelectionKeys = skeys end if player.sgnode.observeField("timedMetaData", player.port) player.sgnode.observeField("timedMetaData2", player.port) end if end function impl.onMetadata = function(msg as object) as void if not m.useStitched then return ret = m.streamManager.onMetadata(msg) if invalid <> ret["shortDuration"] else if invalid <> ret["pendingPod"] pendingPod = ret["pendingPod"] m.setRAFAdPods([pendingPod]) podBeginSec = int(pendingPod.renderTime) while podBeginSec <= m.streamManager.crrntPosSec m.streamManager.handlePosition(podBeginSec, {}) podBeginSec += 1 end while end if end function impl.parsePrplyInfo = function() as object if invalid <> m.prplyInfo if m.prplyInfo.strmType = m.sdk.StreamType.LIVE if invalid <> m.pingInfo and invalid <> m.pingInfo["xmlstr"] obj = m.yspc2raf(m.pingInfo.xmlstr) m.pingInfo["xmlstr"] = invalid if 0 = obj["adBreaks"].count() return obj else for each adBreak in obj["adBreaks"] adBreak["rendersequence"] = "midroll" end for end if m.streamManager.appendPod(obj["adBreaks"]) end if else if m.prplyInfo.strmType = m.sdk.StreamType.VOD and invalid <> m.prplyInfo["xmlstr"] return m.yspc2raf(m.prplyInfo.xmlstr) end if else end if return {adOpportunities:0, adBreaks:[]} end function impl.MIMETYPE = createObject("roRegEx", "(type=""video/)[\-\.\w]+""", "") impl.yspc2raf = function(xmlstr as string) as object if 170 < xmlstr.len() then print "<> <> <> impl.yspc2raf() xmlstr: ";xmlstr adIface = m.sdk.getRokuAds() xmlstr = m.MIMETYPE.replaceall(xmlstr, "\1mp4""") xmlstr = xmlstr.replace("sequence=""0""", "sequence=""1""") obj = adIface.parser.parse(xmlstr, "") for each ab in obj["adPods"] timeOffset = ab.renderTime for each ad in ab.ads m.sdk.setTrackingTime(timeOffset, ad) timeOffset += ad.duration end for end for if invalid <> obj["adpods"] and 0 < obj["adpods"].count() adids = [] for each ad in obj["adPods"][0]["ads"] adids.push(ad["adid"]) end for end if return {adOpportunities:obj["adOpportunities"], adBreaks:obj["adPods"]} end function impl.pingInfo = invalid impl.parsePing = function() as void xmlstr = m.loader.getPingResponse() if invalid <> xmlstr and "" <> xmlstr m.pingInfo = {xmlstr:xmlstr} end if end function impl.onMessageLIVE = function(msg as object, curAd as object) as void if m.sdk.StreamType.LIVE <> m.prplyInfo.strmType then return posSec = msg.getData() if m.streamManager.pastLastAdBreak(posSec) m.streamManager.createTimeToEventMap(invalid) end if m.parsePing() if invalid <> m.pingInfo and invalid <> m.pingInfo["xmlstr"] m.setRAFAdPods() end if if m.shouldPing(posSec) m.loader.ping({position:posSec}) m.last_ping = createObject("roDateTime").asSeconds() end if end function impl.PING_INTERVAL = 10 impl.last_ping = 0 impl.shouldPing = function(posSec as float) as boolean if m.loader.hasPinged() then return false itis = createObject("roDateTime").asSeconds() return (m.last_ping + m.PING_INTERVAL < itis) end function impl.createLoader = function(live_or_vod as string) as object obj = m.sdk.createLoader(live_or_vod) if live_or_vod = m.sdk.StreamType.VOD return obj end if obj.pingURL = "" obj.isPinging = false obj.pingPort = createObject("roMessagePort") obj.ping_json = invalid obj.lastEndTs = 0 obj.tsDuration = 3600 obj.dateTime = createObject("roDateTime") baseobj = m.sdk["vodloader"] obj.getJSON = baseobj.getJSON obj.isValidString = baseobj.isValidString return obj end function strmMgr = rafssai["streamManager"] strmMgr.lastAssetId = invalid strmMgr.PTS = "_decodeInfo_pts" strmMgr.YMID = "YMID" strmMgr.MESSAGEDATA = "MessageData" strmMgr.AD_MID = createObject("roRegex", "[^_]*_YO_([\s\S]*)", "i") strmMgr.pendingPod = invalid strmMgr.appendPod = function(newPodList as object) as void newPod = newPodList[0] if invalid <> m.pendingPod m.appendAdToBreak(newPod, m.pendingPod) end if if 0 < newPod.ads.count() m.pendingPod = newPod end if end function strmMgr.appendAdToBreak = function(newPod as object, destPod as object) as void adsNotAppended = [] for each rAd in newPod.ads timeOffset = destPod.renderTime appended = false for i=0 to destPod.ads.count()-1 currentAd = destPod.ads[i] if invalid = currentAd["id"] m.sdk.setTrackingTime(timeOffset, rAd) destPod.ads[i] = rAd destPod.duration += rAd.duration appended = true exit for else if rAd.id = currentAd.id appended = true exit for end if timeOffset += currentAd.duration end for if not appended then adsNotAppended.push(rAd) end for newPod.ads = adsNotAppended end function strmMgr.getMediaID = function(obj as object) as string ymid = "" if invalid <> obj[m.MESSAGEDATA] ymidobj = {} msgdt = obj[m.MESSAGEDATA] tags = msgdt.split(",") for each kv in tags tag = kv.split("=") if (tag.count() = 2) then ymidobj[tag[0]] = tag[1] end if end for if invalid <> ymidobj[m.YMID] then ymid = ymidobj[m.YMID] else ymidobj = obj ymidhex = ymidobj[m.YMID] if invalid = ymidhex or "" = ymidhex or ymidhex.len() < 2 or "03" <> ymidhex.left(2) then return ymid ymidhex = ymidhex.mid(2) ymidlen = ymidhex.len() ymid = invalid arr = createObject("roArray", ymidlen/2, false) for i=0 to ymidlen-1 step 2 arr[i/2] = chr(val(ymidhex.mid(i, 2), 16)) end for ymid = arr.join("") end if return ymid end function strmMgr.onMetadata = function(msg as object) as object ret = {pendingPod:invalid} if invalid = m.currentAdBreak and invalid = m.pendingPod then return ret if "timedMetaData" <> msg.getField() then return ret obj = msg.getData() ymid = m.getMediaID(obj) if invalid = ymid or "" = ymid then return ret if invalid <> m.currentAdBreak else if invalid <> m.pendingPod for each ad in m.pendingPod.ads if invalid <> ad["adid"] matched = m.AD_MID.match(ad["adid"]) if invalid <> matched and 1 < matched.count() and matched[1] = ymid m.pendingPod.renderTime = obj[m.PTS] timeOffset = m.pendingPod.renderTime for each ad in m.pendingPod.ads m.sdk.setTrackingTime(timeOffset, ad) timeOffset += ad.duration end for m.pendingPod.duration = timeOffset - m.pendingPod.renderTime ret["pendingPod"] = m.pendingPod m.pendingPod = invalid exit for end if end if end for end if return ret end function vodloader = rafssai["vodloader"] vodloader.urlDomain = createObject("roRegEx", "urlDomain=""([^""]+)""", "") vodloader.urlSuffix = createObject("roRegEx", "urlSuffix=""([^""]+)""", "") vodloader.requestPreplay = function(requestObj as object) as object preplayInfo = {playURL:"", xmlstr:""} if not m.isValidString(m.strmURL) m.strmURL = requestObj.url end if vmapstr = m.getJSON({url:m.strmURL, retry:0}) if invalid <> vmapstr preplayInfo["xmlstr"] = vmapstr fields = vmapstr.split("<yospace:Stream") if 1 < fields.count() schm = m.strmURL.split(":")[0] md = m.urlDomain.match(fields[1]) if invalid <> md and 1 < md.count() domain = md[1] ms = m.urlSuffix.match(fields[1]) if invalid <> ms and 1 < ms.count() preplayInfo["Stream"] = {urlDomain:domain, urlSuffix:ms[1]} end if end if end if end if return preplayInfo end function liveloader = rafssai["liveloader"] liveloader.regex = { ANALYTICS_URL : createObject("roRegEx", "^#EXT-X-YOSPACE-ANALYTICS-URL:", "") STREAM_INF : createObject("roRegEx", "^#EXT-X-STREAM-INF:", "") URL : createObject("roRegEx", "^http", "") BANDWIDTH : createObject("roRegEx", "BANDWIDTH=(\d+)", "") RESOLUTION : createObject("roRegEx", "RESOLUTION=(\d+x\d+)", "") BASE_PATH : createObject("roRegEx", "^(([^:/?#]+):)?(//([^/?#]*))?([^?#]*)([\?]([^#]*))?(#(.*))?", "ig") } liveloader.sessionInfo = {} liveloader.parseDASH = function(dash as string) as object preplayInfo = {STREAM_INF:[]} xmldoc = createObject("roXMLElement") success = xmldoc.parse(dash) key = "ANALYTICS_URL" if success then print "<> <> <> parseDash() Now analysing XML playlist" mpd = xmldoc if (mpd <> invalid) and (mpd.GetName() = "MPD") then print "<> <> <> parseDash() Looking for location" loc = mpd.GetNamedElements("Location") if (loc.count() > 0) then locurl = m.regex["BASE_PATH"].match(loc[0].GetText()) if invalid <> locurl and 5 < locurl.count() paths = locurl[5].split(";") paths[0] = "/csm/analytics" preplayInfo[key] = [locurl[1],locurl[3],paths.join(";")].join("") end if end if end if end if if invalid = preplayInfo[key] then m.sdk.log("liveloader.parseDASH() AnalyticsURL not found", 2) return preplayInfo end function liveloader.parseM3u8 = function(m3u8 as string) as object preplayInfo = {STREAM_INF:[]} if invalid <> m3u8 streamInf = {} for each ln in m3u8.split(chr(10)) key = "ANALYTICS_URL" matches = m.regex[key].match(ln) if 0 < matches.count() preplayInfo[key] = ln.mid(matches[0].len()).replace("""","") else key = "STREAM_INF" matches = m.regex[key].match(ln) if 0 < matches.count() key = "BANDWIDTH" matches = m.regex[key].match(ln) if 1 < matches.count() then streamInf[key] = matches[1].toint() key = "RESOLUTION" matches = m.regex[key].match(ln) if 1 < matches.count() then streamInf[key] = matches[1] else key = "URL" matches = m.regex[key].match(ln) if 0 < matches.count() and invalid <> streamInf["BANDWIDTH"] streamInf[key] = ln.trim() preplayInfo["STREAM_INF"].push(streamInf) streamInf = {} end if end if end if end for end if return preplayInfo end function liveloader.requestSession = function(masterURL as string) as string playlistURL = masterURL yourl = m.regex["BASE_PATH"].match(masterURL) if invalid <> yourl and 7 < yourl.count() if invalid <> yourl[3] authority = yourl[4] host = "" userdet = "" if (authority.instr("@") > -1) then host = authority.split("@")[1] else host = authority end if host = host.split(":")[0] end if sessionURL = yourl[2] + "://" + host + "/csm/session" sessionstr = m.getJSON({url:sessionURL, retry:0}) if invalid <> sessionstr fields = sessionstr.split(" ") m.sessionInfo["host"] = fields[0].trim() m.sessionInfo["id"] = fields[1].trim() m.sessionInfo["path"] = yourl[5] + ";jsessionid=" + m.sessionInfo["id"] playlistURL = [yourl[2], "://", m.sessionInfo["host"], m.sessionInfo["path"], "?", yourl[7]].join("") end if end if return playlistURL end function liveloader.requestPreplay = function(requestObj as object) as dynamic if not m.isValidString(m.strmURL) m.strmURL = requestObj.url end if playlistURL = m.requestSession(m.strmURL) res = m.getJSON({url:playlistURL, retry:0}) print "<> <> <> liveloader.requestPreplay() res: ";res if "#EXTM" = res.left(5) preplayInfo = m.parseM3u8(res) else preplayInfo = m.parseDASH(res) end if preplayInfo["playURL"] = playlistURL return preplayInfo end function liveloader.ping = function(params as dynamic) as void if "" = m.pingURL then return url = m.pingURL m.pingXfer = m.sdk.createUrlXfer(m.sdk.httpsRegex.isMatch(url)) m.pingXfer.setMessagePort(m.pingPort) m.pingXfer.setUrl(url) m.pingXfer.addHeader("Accept", "application/json") m.pingXfer.asyncGetToString() m.isPinging = true end function liveloader.hasPinged = function() as boolean return m.isPinging end function liveloader.getPingResponse = function() as string res = "" if not m.isPinging then return res msg = m.pingPort.getMessage() if invalid <> msg and type(msg) = "roUrlEvent" hstat = msg.getResponseCode() if hstat = 200 res = msg.getString() else end if m.isPinging = false end if return res end function liveloader.composePingURL = function(prplyInfo as object) as void if invalid <> prplyInfo["ANALYTICS_URL"] m.pingURL = prplyInfo.ANALYTICS_URL end if end function return rafssai end function function RAFX_SSAI(params as object) as object if invalid <> params and invalid <> params["name"] p = RAFX_getYospaceAdapter(params) p["__version__"] = "0b.42.11" p["__name__"] = params["name"] return p end if end function
Brightscript
4
khangh/samples
advertising/rsgyspc/lib/rafxssai.brs
[ "MIT" ]
_super = (cls, self, method, ...) -> fn = if method == "new" cls.__parent.__init else cls.__parent.__base[method] fn @, ... -- _class "Hello", { -- print_name: => print "hello!" -- }, AnotherClass _class = (name, tbl, extend, setup_fn) -> cls = if extend class extends extend new: tbl and tbl.new @super: _super @__name: name if tbl tbl.new = nil for k,v in pairs tbl @__base[k] = v setup_fn and setup_fn @ else class new: tbl and tbl.new @super: _super @__name: name if tbl tbl.new = nil for k,v in pairs tbl @__base[k] = v setup_fn and setup_fn @ cls { class: _class }
MoonScript
4
tommy-mor/lapis
lapis/lua.moon
[ "MIT", "Unlicense" ]
<!DOCTYPE html> <body> <h2>Supplier's Declaration of Conformity: 47 CFR § 2.1077 Compliance Information</h2> <h3>Unique Identifier</h3> <p>comma three</p> <h3>Authorized Components</h3> <h5>Thundersoft TurboX D845 SOM</h5> <p>FCC ID: 2AOHHTURBOXSOMD845</p> <h5>Quectel/EG25-G</h5> <p>FCC ID: XMR201903EG25G</p> <p> This device complies with Part 15 of the FCC Rules. Operation is subject to the following two conditions: <p>(1) this device may not cause harmful interference, and <p>(2) this device must accept any interference received, including interference that may cause undesired operation.</p> The following test reports are subject to this declaration: Test report number: HR20191001605 Issue date: 2019-2-21 The following manufacturer/importer/entity (located in the USA) is responsible for this declaration: Company name: Quectel Wireless Solutions Co., Ltd. Name/Title (legal representative): Yin JiXiong Address: 7th Floor, Hongye Building, No.1801 Hongmei Road, Xuhui District, Shanghai 200233, China Phone: +8602150086326 Extension: 800 Fax: +862153253668 E-mail: [email protected] </p> <h3>Responsible Party - U.S. Contact Information</h3> <p>comma.ai</p> <p>501 W Broadway St</p> <p>STE A #403</p> <p>San Diego, California</p> <p>92101</p> <p>United States</p> <p>[email protected]</p> <h3>FCC Compliance Statement</h3> <p> This device complies with part 15 of the FCC Rules. Operation is subject to the following two conditions: (1) This device may not cause harmful interference, and (2) this device must accept any interference received, including interference that may cause undesired operation. Note: This equipment has been tested and found to comply with the limits for a Class B digital device, pursuant to part 15 of the FCC Rules. These limits are designed to provide reasonable protection against harmful interference in a residential installation.</p> <p>This equipment generates, uses, and can radiate radio frequency energy and, if not installed and used in accordance with the instructions, may cause harmful interference to radio communications. However, there is no guarantee that interference will not occur in a particular installation.</p> <p>If this equipment does cause harmful interference to radio or television reception, which can be determined by turning the equipment off and on, the user is encouraged to try to correct the interference by one or more of the following measures:</p> <p>Reorient or relocate the receiving antenna.</p> <p>Increase the separation between the equipment and receiver.</p> <p>Connect the equipment to an outlet on a circuit different from that to which the receiver is connected.</p> <p>Consult the dealer or an experienced radio/TV technician for help.</p> <p>Changes or modifications to this product not expressly approved by the party responsible for compliance could void the electromagnetic compatibility (EMC) and wireless compliance and negate your authority to operate the product.</p> <p>This product has demonstrated EMC compliance under conditions that included the use of compliant peripheral devices and shielded cables between system components. It is important that you use compliant peripheral devices and shielded cables between system components to reduce the possibility of causing interference to radios, televisions, and other electronic devices.</p> <p>The radiated output power of this device meets the limits of FCC/IC radio frequency exposure limits. This device should be operated with a minimum separation distance of 20 cm (8 inches) between the equipment and a person's body.</p> </body> </html>
HTML
1
shoes22/openpilot
selfdrive/assets/offroad/fcc.html
[ "MIT" ]
CREATE TABLE `tb_gcekkribdm` ( `col_xpuntwyhls` int(253) unsigned zerofill DEFAULT NULL, `col_doacvjtxfj` text CHARACTER SET utf8, `col_vbxxcedehr` varbinary(72) DEFAULT '\0', `col_spnkzcnaaj` tinyint(221) unsigned zerofill DEFAULT NULL, `col_lctlnulyqs` varchar(141) CHARACTER SET utf8 DEFAULT '', `col_vdafmpnlcj` timestamp NULL DEFAULT NULL, `col_pwwnuhvonf` bit(1) DEFAULT NULL, `col_wpdnfgwkmm` float(253,19) NOT NULL, `col_hmbydpntpk` set('enum_or_set_0','enum_or_set_1','enum_or_set_2') CHARACTER SET utf8 DEFAULT 'enum_or_set_0', `col_kahmeuqzzo` mediumtext, `col_mrruauiuzg` mediumblob, `col_cxafkgwrzu` varbinary(36) DEFAULT NULL, `col_ooxuaiyuqa` mediumint(107) unsigned zerofill DEFAULT NULL, `col_mxpgmnrigf` decimal(10,0) DEFAULT NULL, `col_sgjbftdxrq` mediumtext CHARACTER SET utf8, `col_zboghrfujc` char(34) DEFAULT NULL, `col_xpwlcesvfx` int(73) DEFAULT NULL, `col_ysqvnorogf` int(10) unsigned DEFAULT '1', `col_dznwcqadnc` mediumtext CHARACTER SET utf8 ) ENGINE=InnoDB DEFAULT CHARSET=utf8mb4;
SQL
3
yuanweikang2020/canal
parse/src/test/resources/ddl/alter/mysql_53.sql
[ "Apache-2.0" ]
example : ℕ × ℕ := {fst := have ℕ, from 0, by exact this, snd := 0}
Lean
2
ericrbg/lean
tests/lean/run/structure_instance_delayed_abstr.lean
[ "Apache-2.0" ]
(debug) (load "../lib/all.gf") (env fire (width 50 height 25 max-y (- height 1) buf (Bin/new (* width height)) out stdout max-fade 50 avg-frames 0 avg-time .0) (fun ctrl (args..) (print out "\e[" args..)) (fun clear () (ctrl "2J")) (fun home () (ctrl "H")) (fun init () (for (width i) (set (# buf i) 0xff)) (clear)) (fun render () (let t0 (now) i -1) (for max-y (for (width x) (let v (# buf (inc i)) j (+ i width)) (if (and x (< x (- width 1))) (inc j (- 1 (rand 3)))) (set (# buf j) (if v (- v (rand (min max-fade (+ (int v) 1)))) v)))) (inc i (+ width 1)) (let prev-g _) (home) (for height (for width (let g (# buf (dec i)) r (if g 0xff 0) b (if (= g 0xff) 0xff 0)) (if (= g prev-g) (print out " ") (ctrl "48;2;" (int r) ";" (int (set prev-g g)) ";" (int b) "m "))) (print out \n)) (flush out) (inc avg-time (- (now) t0)) (inc avg-frames)) (fun restore () (ctrl "0m") (clear) (home))) (fire/init) (for 50 (fire/render)) (fire/restore) (say (/ (* 1000000000.0 fire/avg-frames) fire/avg-time))
Grammatical Framework
4
daota2/fffff
v1/demo/fire.gf
[ "MIT" ]
// // Copyright (c) 2012 The ANGLE Project Authors. All rights reserved. // Use of this source code is governed by a BSD-style license that can be // found in the LICENSE file. // sampler2D tex : s0; uniform float4 mode : c0; // Passthrough Pixel Shader // Outputs texture 0 sampled at texcoord 0. float4 passthroughps(float4 texcoord : TEXCOORD0) : COLOR { return tex2D(tex, texcoord.xy); }; // Luminance Conversion Pixel Shader // Outputs sample(tex0, tc0).rrra. // For LA output (pass A) set C0.X = 1, C0.Y = 0. // For L output (A = 1) set C0.X = 0, C0.Y = 1. float4 luminanceps(float4 texcoord : TEXCOORD0) : COLOR { float4 tmp = tex2D(tex, texcoord.xy); tmp.w = tmp.w * mode.x + mode.y; return tmp.xxxw; }; // RGB/A Component Mask Pixel Shader // Outputs sample(tex0, tc0) with options to force RGB = 0 and/or A = 1. // To force RGB = 0, set C0.X = 0, otherwise C0.X = 1. // To force A = 1, set C0.Z = 0, C0.W = 1, otherwise C0.Z = 1, C0.W = 0. float4 componentmaskps(float4 texcoord : TEXCOORD0) : COLOR { float4 tmp = tex2D(tex, texcoord.xy); tmp.xyz = tmp.xyz * mode.x; tmp.w = tmp.w * mode.z + mode.w; return tmp; };
PostScript
4
agramonte/corona
external/Angle/Project/src/libGLESv2/renderer/shaders/Blit.ps
[ "MIT" ]
// FIR filter demo program, Perry R. Cook, Oct 2012 // This shows how to load filter coefficients // explicitly, in this case with a Sinc lowpass filter Noise n => Gain g => FIR f => WvOut w => dac; w.wavFilename("temp.wav"); 127 => f.order; f.coeff(64,1.0); for (1 => int i; i < 63; i++) { (i * pi)/4.0 => float temp; f.coeff(64-i,Math.cos(i*pi/128)*(Math.sin(temp)/temp)); <<< i, f.coeff(64+i,f.coeff(64-i)) >>>; } 0.2 => g.gain; 5.0 :: second => now; w.closeFile();
ChucK
3
ccdarabundit/chugins
FIR/examples/FIRSincExplicit.ck
[ "MIT" ]
dlg : dialog { label = "textEditAd"; initial_focus = "userValue"; : column { : row { : list_box { height = 20; width = 36; key = "listbox"; allow_accept = true; } } :row { : edit_box { label = "newstr"; key = "userValue"; //value = ""; width = 24; is_enabled = true; allow_accept = true; } } ok_cancel; } }
Clean
3
acaduser/otools
command/textEditAd.dcl
[ "MIT" ]
\data\ ngram 1=88 ngram 2=680 ngram 3=1816 \1-grams: -2.5346286 <unk> 0 0 <s> -1.1612923 -1.3083265 </s> 0 -1.7379138 (69,False) -0.30323333 -1.6440431 (64,False) -0.34543043 -1.6731358 (60,False) -0.3797113 -1.6440431 (57,False) -0.40104002 -1.0733433 ||| -0.7543727 -1.774328 (69,True) -0.29889613 -1.6440431 (64,True) -0.42028806 -1.5911231 (60,True) -0.3631282 -1.5669 (57,True) -0.4039366 -1.7043182 (62,False) -0.33965483 -1.6440431 (59,False) -0.36482483 -1.7043182 (62,True) -0.3485124 -1.6731358 (59,True) -0.32795864 -1.9064986 (71,False) -0.24832974 -2.2967658 (68,False) -0.23716554 -2.0240583 (71,True) -0.24208361 -2.446269 (68,True) -0.22565342 -1.9613128 (72,False) -0.33039403 -1.7043182 (67,False) -0.35187358 -1.9064986 (72,True) -0.28556934 -1.6731358 (67,True) -0.36974078 -1.7043182 (55,False) -0.44311738 -1.5911231 (55,True) -0.40205264 -1.8140769 (65,False) -0.31320122 -1.9064986 (53,False) -0.3969855 -2.0240583 (65,True) -0.33085176 -1.7379138 (53,True) -0.449938 -1.9064986 (45,False) -0.643749 -1.6167775 (45,True) -0.73727393 -1.7379138 (47,False) -0.8717935 -1.8140769 (47,True) -0.62490076 -1.774328 (48,False) -0.45731443 -1.5014148 (48,True) -0.57400143 -2.0240583 (66,False) -0.26449522 -1.6440431 (50,False) -0.7182524 -1.7379138 (52,False) -0.4756903 -1.7379138 (52,True) -0.36088395 -1.8140769 (50,True) -0.53149384 -2.4863749 (79,False) -0.25099376 -2.4002538 (79,True) -0.28004554 -2.0240583 (56,False) -0.31978354 -2.0974255 (74,False) -0.25312787 -2.0240583 (76,False) -0.2906442 -2.0974255 (76,True) -0.28756753 -2.4863749 (77,False) -0.253813 -2.4002538 (77,True) -0.28004554 -2.1857576 (56,True) -0.28122315 -2.4863749 (44,False) -0.21721527 -2.4863749 (44,True) -0.21721527 -2.4863749 (40,False) -0.21721527 -2.4863749 (40,True) -0.21721527 -2.1857576 (41,False) -0.4568202 -2.446269 (74,True) -0.253813 -2.446269 (36,False) -0.23497145 -2.446269 (36,True) -0.23497145 -2.4863749 (46,False) -0.21721527 -2.4002538 (38,False) -0.28004554 -2.4002538 (38,True) -0.28004554 -2.4863749 (58,False) -0.28004554 -2.4863749 (63,False) -0.28004554 -2.2967658 (54,False) -0.253813 -2.4863749 (63,True) -0.28004554 -2.1857576 (54,True) -0.23716554 -2.446269 (66,True) -0.26259 -2.4863749 (61,False) -0.28004554 -2.4863749 (61,True) -0.26346543 -2.4863749 (81,False) -0.28004554 -2.4002538 (81,True) -0.28004554 -2.1857576 (43,False) -0.4568202 -2.1857576 (43,True) -0.42190024 -2.4863749 (58,True) -0.28004554 -2.4863749 (41,True) -0.21721527 -2.4002538 (70,False) -0.28004554 -2.4002538 (70,True) -0.28004554 -2.4002538 (46,True) -0.28004554 -2.4863749 (.) -0.21721527 -2.4002538 (75,False) -0.28004554 -2.4002538 (75,True) -0.28004554 -2.4002538 (33,False) -0.28004554 -2.4863749 (33,True) -0.21721527 -2.4002538 (84,False) -0.28004554 -2.4002538 (84,True) -0.28004554 -2.4002538 (83,False) -0.28004554 -2.4863749 (49,False) -0.21721527 -2.4863749 (49,True) -0.21721527 \2-grams: -1.3283784 (69,False) </s> 0 -1.5063841 (64,False) </s> 0 -1.5253698 (60,False) </s> 0 -1.4850775 (57,False) </s> 0 -1.0408268 ||| </s> 0 -1.1196313 (69,True) </s> 0 -1.3049452 (64,True) </s> 0 -1.3116624 (60,True) </s> 0 -1.3831081 (57,True) </s> 0 -1.3222051 (62,True) </s> 0 -1.3828864 (59,True) </s> 0 -1.1828344 (71,True) </s> 0 -0.8486613 (68,True) </s> 0 -1.3984898 (72,False) </s> 0 -1.4717426 (67,False) </s> 0 -1.4083465 (72,True) </s> 0 -1.2544838 (67,True) </s> 0 -1.3606266 (55,True) </s> 0 -1.4167385 (65,False) </s> 0 -1.3362716 (65,True) </s> 0 -1.0090735 (53,True) </s> 0 -1.2314252 (45,False) </s> 0 -1.4998447 (45,True) </s> 0 -1.3409567 (47,True) </s> 0 -1.3193595 (48,True) </s> 0 -1.2499542 (52,True) </s> 0 -1.1961613 (50,True) </s> 0 -1.1347464 (79,True) </s> 0 -1.1250837 (74,False) </s> 0 -1.3188645 (76,True) </s> 0 -1.1848569 (56,True) </s> 0 -1.06444 (61,True) </s> 0 -1.0095764 (43,True) </s> 0 -0.5793442 (70,True) </s> 0 -0.76276016 <s> (69,False) -0.9836545 -1.7639475 (64,False) (69,False) -0.2069609 -1.4800048 ||| (69,False) -0.82400584 -0.90398127 (72,False) (69,False) -0.9412739 -1.6372888 (72,True) (69,False) -0.2069609 -1.4843656 (48,False) (69,False) -0.2069609 -1.2002186 (79,False) (69,False) -0.2069609 -1.2432144 (79,True) (69,False) -0.21674097 -1.2385746 (74,False) (69,False) -0.2069609 -1.2544156 (76,False) (69,False) -0.75044346 -1.4940231 (76,True) (69,False) -0.2069609 -0.9778116 (77,False) (69,False) -0.36248344 -0.6069187 (81,False) (69,False) -0.2069609 -0.90281475 <s> (64,False) -0.842022 -0.87673163 (69,False) (64,False) -1.1956515 -1.6037724 (60,False) (64,False) -0.2069609 -1.5995817 ||| (64,False) -0.77173024 -1.5332305 (69,True) (64,False) -0.36248344 -1.8059874 (60,True) (64,False) -0.2069609 -1.0432469 (71,False) (64,False) -0.36188102 -0.84063125 (68,False) (64,False) -0.3416797 -1.2968788 (71,True) (64,False) -0.2069609 -0.89686227 (72,False) (64,False) -0.5712954 -0.84944665 (67,False) (64,False) -0.9733365 -1.465354 (72,True) (64,False) -0.36248344 -1.7695742 (67,True) (64,False) -0.2069609 -1.6095424 (65,True) (64,False) -0.21674097 -1.4025397 (76,False) (64,False) -0.2069609 -1.4642463 (76,True) (64,False) -0.2069609 -1.1303014 <s> (60,False) -0.9288058 -1.1252455 (69,False) (60,False) -0.6320682 -0.9637482 (64,False) (60,False) -1.1766748 -1.8786907 ||| (60,False) -0.43530515 -1.8363999 (64,True) (60,False) -0.2069609 -1.7205987 (62,False) (60,False) -0.2069609 -1.7164121 (62,True) (60,False) -0.2069609 -1.4585886 (71,True) (60,False) -0.2069609 -1.0438129 (72,False) (60,False) -0.2777974 -0.9363673 (67,False) (60,False) -0.8986543 -1.5475131 (67,True) (60,False) -0.21280245 -1.3159924 (65,False) (60,False) -0.39543465 -1.621848 (65,True) (60,False) -0.2069609 -1.410883 (76,False) (60,False) -0.2069609 -0.60421586 (63,False) (60,False) -0.2069609 -1.5804268 <s> (57,False) -0.6122152 -1.604337 (69,False) (57,False) -0.915711 -1.0433443 (64,False) (57,False) -0.801596 -0.87914044 (60,False) (57,False) -1.0689081 -2.2691224 ||| (57,False) -0.21674097 -1.7120687 (64,True) (57,False) -0.2069609 -1.5999157 (60,True) (57,False) -0.2069609 -1.263044 (62,False) (57,False) -0.27172735 -1.7017623 (62,True) (57,False) -0.46778375 -1.5594152 (72,False) (57,False) -0.2069609 -1.7695742 (67,True) (57,False) -0.2069609 -1.3096116 (65,False) (57,False) -0.36248344 -1.6095424 (65,True) (57,False) -0.2069609 -1.1860893 (66,False) (57,False) -0.2069609 -1.143849 (66,True) (57,False) -0.21674097 -0.88365173 (61,False) (57,False) -0.2069609 -1.2091604 (64,False) ||| -0.3589305 -0.8593539 (60,False) ||| -0.9530802 -0.5367225 (57,False) ||| -1.0155385 -1.4134109 (64,True) ||| -0.36248344 -0.9474326 (60,True) ||| -0.9049944 -0.4969293 (57,True) ||| -0.9613349 -1.1991677 (62,False) ||| -0.38651282 -0.6496695 (59,False) ||| -0.54137015 -1.2682446 (62,True) ||| -0.3180795 -0.73253834 (59,True) ||| -0.54453564 -1.2483921 (72,False) ||| -0.2069609 -1.1617534 (67,False) ||| -0.3180795 -1.241546 (72,True) ||| -0.36248344 -1.3173085 (67,True) ||| -0.2069609 -0.44224364 (55,False) ||| -0.44405776 -0.8132496 (55,True) ||| -0.54604733 -1.2559818 (65,False) ||| -0.51777095 -0.46024972 (53,False) ||| -0.5334045 -1.2724109 (65,True) ||| -0.6427097 -0.40211698 (53,True) ||| -0.60192084 -0.12811187 (45,False) ||| -0.83165693 -0.12969743 (45,True) ||| -0.8127401 -0.05699735 (47,False) ||| -0.4900657 -0.16685088 (47,True) ||| -0.49260855 -0.31158072 (48,False) ||| -0.9677958 -0.27607802 (48,True) ||| -0.8784176 -0.18890695 (50,False) ||| -0.5827148 -0.38319665 (52,False) ||| -0.73680764 -0.575021 (52,True) ||| -0.8217374 -0.26705238 (50,True) ||| -0.52771837 -0.50643456 (56,False) ||| -0.41980597 -1.147469 (76,False) ||| -0.2069609 -1.1792012 (76,True) ||| -0.2069609 -0.827789 (56,True) ||| -0.45860833 -0.3518503 (44,False) ||| -0.6427097 -0.3518503 (44,True) ||| -0.61941236 -0.3518503 (40,False) ||| -0.40159565 -0.3518503 (40,True) ||| -0.21427523 -0.16735315 (41,False) ||| -0.29198372 -0.3306582 (36,False) ||| -0.33676213 -0.3306582 (36,True) ||| -0.50189584 -0.3518503 (46,False) ||| -0.2069609 -0.28435698 (38,False) ||| -0.2069609 -0.28435698 (38,True) ||| -0.2069609 -0.78745806 (58,False) ||| -0.2069609 -0.84731334 (54,False) ||| -0.2069609 -0.89235437 (54,True) ||| -0.2069609 -0.78745806 (61,False) ||| -0.2069609 -0.97694564 (61,True) ||| -0.46778375 -0.16735315 (43,False) ||| -0.2069609 -0.24091142 (43,True) ||| -0.2777974 -0.54983574 (58,True) ||| -0.2069609 -0.3518503 (41,True) ||| -0.2069609 -0.28435698 (46,True) ||| -0.2069609 -0.28435698 (33,False) ||| -0.2069609 -0.3518503 (33,True) ||| -0.2069609 -0.3518503 (49,False) ||| -0.46778375 -0.3518503 (49,True) ||| -0.37978578 -1.1685188 ||| (69,True) -1.1961441 -1.6050143 (72,False) (69,True) -0.2069609 -1.3513654 (72,True) (69,True) -0.9623999 -1.7523857 (48,True) (69,True) -0.2069609 -1.2059381 (79,False) (69,True) -0.2069609 -1.2491218 (79,True) (69,True) -0.2069609 -1.5044204 (76,True) (69,True) -0.8534295 -0.9812076 (77,False) (69,True) -0.46778375 -0.8940299 (77,True) (69,True) -0.29346478 -0.9812076 (74,True) (69,True) -0.21674097 -0.6082765 (81,True) (69,True) -0.2069609 -0.68407416 (.) (69,True) -0.6427097 -1.3269126 (69,False) (64,True) -0.2069609 -1.2003566 ||| (64,True) -1.1538982 -0.8138045 (69,True) (64,True) -1.18224 -1.7114074 (60,True) (64,True) -0.36248344 -1.2515093 (71,False) (64,True) -0.21060267 -1.034545 (68,False) (64,True) -0.2069609 -1.1385136 (71,True) (64,True) -0.578357 -0.89981556 (68,True) (64,True) -0.73961973 -1.526182 (67,False) (64,True) -0.2069609 -0.9799755 (72,True) (64,True) -0.7619848 -1.0432947 (67,True) (64,True) -1.2042946 -1.1834986 (79,False) (64,True) -0.2069609 -1.2259595 (79,True) (64,True) -0.2069609 -1.4642463 (76,True) (64,True) -0.36248344 -0.60287064 (70,False) (64,True) -0.2069609 -0.60287064 (70,True) (64,True) -0.2069609 -1.4529233 (69,False) (60,True) -0.46778375 -1.4531443 (64,False) (60,True) -0.2069609 -1.3649833 ||| (60,True) -1.0125855 -1.3832905 (69,True) (60,True) -0.802104 -1.2651186 (64,True) (60,True) -1.2802795 -1.5660408 (62,False) (60,True) -0.2069609 -1.6601782 (59,False) (60,True) -0.2069609 -1.6738669 (62,True) (60,True) -0.2069609 -1.6363813 (59,True) (60,True) -0.2069609 -1.5105976 (71,False) (60,True) -0.2069609 -1.3089204 (72,True) (60,True) -0.29702 -0.9700004 (67,True) (60,True) -0.95033336 -1.2971245 (65,False) (60,True) -0.4799824 -1.1065172 (65,True) (60,True) -0.5768861 -0.81465626 (66,False) (60,True) -0.3416797 -1.445472 (76,True) (60,True) -0.21674097 -0.76480186 (63,True) (60,True) -0.2069609 -1.1342385 (66,True) (60,True) -0.2069609 -1.445036 (64,False) (57,True) -0.46778375 -1.5728066 (60,False) (57,True) -0.21674097 -1.5400771 ||| (57,True) -0.8806514 -1.6122202 (69,True) (57,True) -1.1867777 -0.86308706 (64,True) (57,True) -0.9443243 -0.9492276 (60,True) (57,True) -1.1929498 -1.1180663 (62,False) (57,True) -0.5053758 -1.3958522 (59,False) (57,True) -0.51777095 -1.1048548 (62,True) (57,True) -0.28352705 -1.5080154 (59,True) (57,True) -0.4385897 -1.4984634 (67,False) (57,True) -0.4385897 -1.5587168 (72,True) (57,True) -0.36248344 -1.6256117 (67,True) (57,True) -0.4385897 -1.4314243 (65,False) (57,True) -0.4385897 -1.1027237 (65,True) (57,True) -0.40159565 -1.1703815 (66,False) (57,True) -0.2069609 -1.2791363 (56,False) (57,True) -0.2069609 -1.1295117 (66,True) (57,True) -0.46778375 -1.1296864 (61,True) (57,True) -0.2069609 -2.4295342 <s> (62,False) -0.46778375 -1.4905689 (69,False) (62,False) -0.28352705 -2.1467535 ||| (62,False) -0.26542774 -1.415481 (69,True) (62,False) -0.42735487 -1.4159331 (64,True) (62,False) -0.44088817 -1.4168652 (71,False) (62,False) -0.2069609 -0.84578764 (68,False) (62,False) -0.29198372 -1.0451512 (67,False) (62,False) -0.801596 -1.4851208 (72,True) (62,False) -0.46778375 -1.3654966 (67,True) (62,False) -0.24903734 -0.70091367 (65,False) (62,False) -0.34990847 -1.6345124 (65,True) (62,False) -0.2069609 -1.1968858 (66,False) (62,False) -0.2069609 -1.2324419 (74,False) (62,False) -0.2069609 -1.1448835 (64,False) (59,False) -0.5117496 -2.201318 ||| (59,False) -0.46778375 -1.5332305 (69,True) (59,False) -0.2069609 -1.0937189 (64,True) (59,False) -0.55229366 -1.5999157 (60,True) (59,False) -0.45731324 -0.8164185 (62,False) (59,False) -0.5748722 -1.5810901 (62,True) (59,False) -0.2069609 -1.3984325 (71,False) (59,False) -0.2069609 -1.034545 (68,False) (59,False) -0.51777095 -1.526182 (67,False) (59,False) -0.30060455 -1.3530282 (67,True) (59,False) -0.3589305 -1.3096116 (65,False) (59,False) -0.3180795 -1.6095424 (65,True) (59,False) -0.2069609 -1.5720774 (45,True) (59,False) -0.2069609 -1.1860893 (66,False) (59,False) -0.21674097 -0.60287064 (63,False) (59,False) -0.2069609 -1.4905689 (69,False) (62,True) -0.21427523 -1.7475207 (64,False) (62,True) -0.2069609 -1.7991788 ||| (62,True) -0.354042 -1.5557123 (69,True) (62,True) -0.45495945 -1.6076899 (64,True) (62,True) -0.38043708 -1.4692323 (71,True) (62,True) -0.2069609 -0.9058899 (68,True) (62,True) -0.21427523 -1.6231662 (72,True) (62,True) -0.2069609 -1.1315212 (67,True) (62,True) -0.8674877 -1.619679 (65,False) (62,True) -0.2069609 -0.7858478 (65,True) (62,True) -0.35468158 -1.1968858 (66,False) (62,True) -0.2069609 -0.9744419 (74,True) (62,True) -0.2069609 -0.77601457 (66,True) (62,True) -0.21674097 -1.6173041 (69,False) (59,True) -0.2069609 -1.6120234 (64,False) (59,True) -0.2069609 -1.7405769 (60,False) (59,True) -0.2069609 -2.2195702 ||| (59,True) -0.46778375 -1.544326 (69,True) (59,True) -0.2069609 -1.1782727 (64,True) (59,True) -0.7429632 -1.7258875 (60,True) (59,True) -0.4385897 -1.5995712 (62,False) (59,True) -0.2069609 -0.86284304 (62,True) (59,True) -0.61266077 -1.4585886 (71,True) (59,True) -0.2069609 -1.0941129 (68,True) (59,True) -0.88574773 -1.2283031 (67,True) (59,True) -0.40534192 -1.4807044 (65,True) (59,True) -0.3111852 -0.77069163 (63,True) (59,True) -0.21674097 -1.1487353 (66,True) (59,True) -0.21674097 -1.8667572 <s> (71,False) -0.28352705 -1.7569638 ||| (71,False) -0.42619455 -1.7687149 (69,True) (71,False) -0.2069609 -1.7595198 (67,False) (71,False) -0.2069609 -1.0673379 (74,False) (71,False) -0.258976 -1.2785776 (76,False) (71,False) -0.56645775 -1.5371947 (76,True) (71,False) -0.2069609 -0.90197957 (77,True) (71,False) -0.2069609 -0.31717315 (75,False) (71,False) -0.3416797 -1.5229836 (71,False) (68,False) -0.21280245 -1.7137067 (72,False) (68,False) -0.2069609 -1.3108025 (76,False) (68,False) -0.51777095 -1.5979968 (76,True) (68,False) -0.4385897 -1.3359538 ||| (71,True) -0.7107801 -1.8081319 (69,True) (71,True) -0.2069609 -1.9450109 (67,True) (71,True) -0.2069609 -1.5605043 (76,True) (71,True) -0.70538294 -0.9073614 (77,True) (71,True) -0.2069609 -0.99859786 (74,True) (71,True) -0.27172735 -0.3185667 (75,True) (71,True) -0.6427097 -1.607649 (71,True) (68,True) -0.55522513 -1.8115574 (72,True) (68,True) -0.2069609 -1.6112498 (76,True) (68,True) -0.62550473 -0.62884676 <s> (72,False) -1.118843 -1.4973232 ||| (72,False) -0.8876028 -1.0287611 (79,False) (72,False) -0.39036646 -1.2706085 (74,False) (72,False) -0.2069609 -0.8596133 (76,False) (72,False) -0.824088 -1.5486932 (76,True) (72,False) -0.21674097 -0.7864309 (77,False) (72,False) -0.21427523 -0.61375046 (81,False) (72,False) -0.46778375 -1.036485 <s> (67,False) -0.7676484 -1.6306704 (69,False) (67,False) -0.2069609 -1.7475207 (64,False) (67,False) -0.2069609 -1.4766225 ||| (67,False) -0.6952916 -1.5557123 (69,True) (67,False) -0.2069609 -1.264571 (71,False) (67,False) -0.45961833 -1.2675871 (72,False) (67,False) -1.2606933 -1.4851208 (72,True) (67,False) -0.29198372 -1.2956631 (48,False) (67,False) -0.2069609 -1.1945734 (79,False) (67,False) -0.21427523 -1.2373862 (79,True) (67,False) -0.2069609 -0.86522704 (74,False) (67,False) -0.38889372 -0.8456372 (76,False) (67,False) -0.68081576 -1.483869 (76,True) (67,False) -0.2069609 -1.1550381 ||| (72,True) -1.3602527 -1.7595198 (67,False) (72,True) -0.2069609 -1.8994497 (67,True) (72,True) -0.2069609 -1.2673419 (79,True) (72,True) -0.61468095 -1.3577464 (76,True) (72,True) -0.9345036 -0.99155796 (77,False) (72,True) -0.46778375 -0.90197957 (77,True) (72,True) -0.46807498 -0.61237544 (81,True) (72,True) -0.46778375 -0.6897245 (.) (72,True) -0.6427097 -1.6173041 (69,False) (67,True) -0.2069609 -1.2021437 ||| (67,True) -1.0073696 -1.6682436 (69,True) (67,True) -0.21427523 -1.8363999 (64,True) (67,True) -0.2069609 -1.2579911 (71,False) (67,True) -0.36248344 -1.1435745 (71,True) (67,True) -0.46333387 -1.4198647 (72,False) (67,True) -0.2069609 -1.1227129 (72,True) (67,True) -1.2496855 -1.6069331 (65,False) (67,True) -0.2069609 -1.560268 (48,True) (67,True) -0.21182339 -1.2316353 (79,True) (67,True) -0.21280245 -1.2263945 (74,False) (67,True) -0.36248344 -0.9271616 (76,True) (67,True) -0.7810042 -0.77145195 (74,True) (67,True) -0.5278497 -0.60421586 (70,False) (67,True) -0.2069609 -1.2887163 (64,False) (55,False) -0.4433211 -1.0378947 (60,False) (55,False) -0.99390423 -1.737826 (64,True) (55,False) -0.21674097 -1.8429279 (60,True) (55,False) -0.51383245 -1.6654859 (57,True) (55,False) -0.46778375 -1.6113491 (62,False) (55,False) -0.4006164 -1.2236925 (59,False) (55,False) -0.3525779 -1.6917342 (59,True) (55,False) -0.2069609 -1.3965771 (67,False) (55,False) -0.21280245 -1.619679 (65,False) (55,False) -0.2069609 -1.5808983 (45,True) (55,False) -0.2069609 -0.8888098 (58,False) (55,False) -0.2069609 -0.8888098 (61,False) (55,False) -0.2069609 -1.1538117 (61,True) (55,False) -0.2069609 -1.6874007 (64,False) (55,True) -0.2069609 -1.4525387 (60,False) (55,True) -0.2069609 -1.6310922 (57,False) (55,True) -0.2069609 -1.3913503 (64,True) (55,True) -0.5159763 -1.2007716 (60,True) (55,True) -0.9782501 -1.6211721 (57,True) (55,True) -0.46778375 -1.5660408 (62,False) (55,True) -0.29198372 -1.6601782 (59,False) (55,True) -0.2069609 -1.1085145 (62,True) (55,True) -0.5743522 -1.0569378 (59,True) (55,True) -0.45821375 -1.6329466 (67,False) (55,True) -0.2069609 -1.5195795 (67,True) (55,True) -0.4084658 -1.5707976 (65,False) (55,True) -0.21674097 -1.5859301 (65,True) (55,True) -0.21674097 -1.5634321 (45,True) (55,True) -0.2069609 -0.8785542 (58,False) (55,True) -0.2069609 -0.94935733 (61,True) (55,True) -0.21674097 -0.60019284 (58,True) (55,True) -0.2069609 -2.466606 <s> (65,False) -0.2069609 -1.1425422 (69,False) (65,False) -0.52854335 -1.9141102 ||| (65,False) -0.354042 -1.5917803 (69,True) (65,False) -0.35047385 -1.9049948 (60,True) (65,False) -0.2069609 -1.2849311 (71,False) (65,False) -0.2069609 -1.5028241 (71,True) (65,False) -0.2069609 -1.452448 (72,False) (65,False) -0.36248344 -1.728034 (67,False) (65,False) -0.2069609 -1.6669911 (72,True) (65,False) -0.3776736 -1.5877935 (67,True) (65,False) -0.41950002 -1.7044712 (69,False) (53,False) -0.2069609 -1.5264623 (60,False) (53,False) -0.6427097 -1.0208948 (57,False) (53,False) -0.57275736 -1.8246603 (60,True) (53,False) -0.2630833 -1.6755666 (62,False) (53,False) -0.36248344 -1.7916915 (59,False) (53,False) -0.46778375 -1.6173774 (59,True) (53,False) -0.36248344 -1.6978587 (55,True) (53,False) -0.32447472 -1.5245882 (65,False) (53,False) -0.51777095 -1.6418167 ||| (65,True) -0.5350218 -1.4782841 (69,True) (65,True) -0.5512985 -2.0045412 (60,True) (65,True) -0.2069609 -1.4883407 (71,False) (65,True) -0.3180795 -1.186337 (71,True) (65,True) -0.2069609 -1.562386 (72,True) (65,True) -0.33213156 -1.6321951 (67,True) (65,True) -0.36711982 -1.7639475 (64,False) (53,True) -0.46778375 -1.7709341 (60,False) (53,True) -0.2069609 -1.5357114 (57,False) (53,True) -0.36248344 -1.6992214 (69,True) (53,True) -0.21674097 -1.4509125 (60,True) (53,True) -0.6068926 -1.1918308 (57,True) (53,True) -0.6446573 -1.7524462 (62,False) (53,True) -0.2069609 -1.5886726 (59,False) (53,True) -0.21280245 -1.6151214 (62,True) (53,True) -0.39036646 -1.7067497 (59,True) (53,True) -0.21674097 -1.6591232 (55,False) (53,True) -0.2069609 -1.5037328 (55,True) (53,True) -0.3297193 -1.3428918 (65,True) (53,True) -0.73961973 -1.7044712 (69,False) (45,False) -0.2069609 -1.8366768 (64,False) (45,False) -0.21674097 -1.6859756 (60,False) (45,False) -1.2020178 -1.5720222 (57,False) (45,False) -1.119831 -1.7281083 (57,True) (45,False) -0.2069609 -1.7033051 (55,False) (45,False) -0.2069609 -1.1309439 (48,False) (45,False) -0.8188009 -1.2488745 (52,False) (45,False) -0.7810124 -0.99155796 (54,False) (45,False) -0.2069609 -1.7122037 (60,False) (45,True) -0.2069609 -1.6393292 (69,True) (45,True) -0.21674097 -1.8043168 (64,True) (45,True) -0.3416797 -1.6973945 (60,True) (45,True) -1.2772604 -1.3091782 (57,True) (45,True) -1.4954946 -1.5769324 (62,False) (45,True) -0.21674097 -1.5478759 (59,False) (45,True) -0.51777095 -1.5703142 (62,True) (45,True) -0.21674097 -1.5277948 (59,True) (45,True) -0.51777095 -1.6190238 (55,False) (45,True) -0.2069609 -1.7278088 (55,True) (45,True) -0.2069609 -1.4755982 (53,False) (45,True) -0.2069609 -1.4579941 (48,False) (45,True) -0.2069609 -1.0140257 (48,True) (45,True) -0.9546379 -1.1359215 (52,True) (45,True) -1.061839 -0.8380758 (54,True) (45,True) -0.2069609 -1.1391762 (61,True) (45,True) -0.3416797 -1.7513012 (64,True) (47,False) -0.21674097 -1.7563822 (60,True) (47,False) -0.4385897 -1.8082352 (57,True) (47,False) -0.21674097 -1.2794101 (62,False) (47,False) -0.4385897 -1.5886726 (59,False) (47,False) -0.4385897 -1.7472829 (62,True) (47,False) -0.2069609 -1.6591232 (55,False) (47,False) -0.3416797 -1.5037328 (55,True) (47,False) -0.21674097 -1.7428602 (48,True) (47,False) -0.2069609 -0.80016184 (50,False) (47,False) -0.8535631 -1.3686898 (52,True) (47,False) -0.3416797 -1.3155146 (56,False) (47,False) -0.2069609 -0.9778116 (54,False) (47,False) -0.2069609 -1.9086922 (64,True) (47,True) -0.2069609 -1.7891809 (60,True) (47,True) -0.21674097 -1.8419122 (57,True) (47,True) -0.2069609 -1.1350342 (62,True) (47,True) -0.51777095 -1.5931908 (59,True) (47,True) -0.3416797 -1.8176165 (55,True) (47,True) -0.55522513 -1.7621249 (48,True) (47,True) -0.2069609 -1.5444132 (52,True) (47,True) -0.46778375 -0.83755183 (50,True) (47,True) -0.7583432 -1.3220859 (56,True) (47,True) -0.46778375 -0.8536389 (54,True) (47,True) -0.46778375 -2.587928 <s> (48,False) -0.2069609 -1.3000731 (64,False) (48,False) -1.0593733 -1.5003977 (60,False) (48,False) -1.043579 -1.381959 (57,False) (48,False) -0.72615856 -1.458801 (60,True) (48,False) -0.21427523 -1.6050143 (72,False) (48,False) -0.2069609 -1.4109712 (67,False) (48,False) -0.58471775 -1.3325558 (55,False) (48,False) -1.0746132 -1.8012989 (55,True) (48,False) -0.2069609 -1.5156604 (53,False) (48,False) -0.2069609 -0.8501997 (52,False) (48,False) -1.1013476 -1.6876959 (52,True) (48,False) -0.2069609 -1.6346002 (64,False) (48,True) -0.2069609 -1.5897355 (57,False) (48,True) -0.2069609 -2.1589828 ||| (48,True) -0.2069609 -1.0760187 (64,True) (48,True) -1.1836839 -1.385706 (60,True) (48,True) -1.1971002 -1.4630929 (57,True) (48,True) -0.75589144 -1.5250158 (62,False) (48,True) -0.4385897 -1.6124675 (59,False) (48,True) -0.2069609 -1.520114 (62,True) (48,True) -0.3416797 -1.5241892 (72,True) (48,True) -0.21674097 -1.4849272 (67,True) (48,True) -0.97006863 -1.5736041 (55,False) (48,True) -0.2069609 -1.1246036 (55,True) (48,True) -1.2541951 -1.4069711 (65,False) (48,True) -0.21674097 -1.2840623 (53,False) (48,True) -0.6427097 -1.4217628 (65,True) (48,True) -0.21674097 -1.0377722 (53,True) (48,True) -0.6938622 -1.5179372 (52,False) (48,True) -0.2069609 -1.1173031 (52,True) (48,True) -1.2605752 -1.2620295 (56,False) (48,True) -0.2069609 -0.7569725 (54,False) (48,True) -0.2069609 -1.0111535 (54,True) (48,True) -0.2069609 -1.5654949 (69,False) (66,False) -0.46778375 -2.5155358 ||| (66,False) -0.2069609 -1.8081319 (69,True) (66,False) -0.46778375 -1.4883407 (71,False) (66,False) -0.21280245 -1.5520815 (71,True) (66,False) -0.2069609 -1.7332865 (72,True) (66,False) -0.2069609 -1.5605043 (76,True) (66,False) -0.2069609 -1.7261586 (60,False) (50,False) -0.2069609 -1.6533477 (57,False) (50,False) -0.46778375 -1.7114074 (60,True) (50,False) -0.58471775 -1.5093868 (57,True) (50,False) -0.21427523 -1.263044 (62,False) (50,False) -0.73961973 -1.6861547 (59,False) (50,False) -0.46778375 -1.7017623 (62,True) (50,False) -0.46778375 -1.6631764 (59,True) (50,False) -0.2069609 -1.7695742 (67,True) (50,False) -0.2069609 -1.6287069 (55,False) (50,False) -0.21674097 -1.1453191 (55,True) (50,False) -0.555877 -1.5945508 (65,False) (50,False) -0.46778375 -0.91443366 (53,False) (50,False) -0.6427097 -1.4982306 (52,True) (50,False) -0.5047245 -1.1165507 (56,False) (50,False) -0.3180795 -1.2883471 (56,True) (50,False) -0.46778375 -1.4961249 (64,False) (52,False) -0.5153052 -1.1461622 (60,False) (52,False) -0.7342669 -1.1557643 (57,False) (52,False) -0.73961973 -1.8626475 (60,True) (52,False) -0.2069609 -1.6773088 (57,True) (52,False) -0.2069609 -1.7524462 (62,False) (52,False) -0.2069609 -1.5886726 (59,False) (52,False) -0.66903865 -1.7472829 (62,True) (52,False) -0.46778375 -1.6986775 (67,False) (52,False) -0.46778375 -0.9525487 (55,False) (52,False) -0.8070221 -1.6296408 (53,True) (52,False) -0.2069609 -1.1287191 (56,False) (52,False) -0.3416797 -0.891412 (61,False) (52,False) -0.2069609 -1.7709341 (60,False) (52,True) -0.2069609 -1.6890274 (57,False) (52,True) -0.2069609 -1.4223025 (64,True) (52,True) -0.6641211 -1.3223748 (60,True) (52,True) -0.8579123 -1.5345263 (57,True) (52,True) -0.76295185 -1.6234554 (62,False) (52,True) -0.3111852 -1.0870438 (59,False) (52,True) -0.3111852 -1.7472829 (62,True) (52,True) -0.2069609 -1.2146603 (59,True) (52,True) -1.0513736 -1.7008376 (67,True) (52,True) -0.21674097 -1.0503932 (55,True) (52,True) -1.020073 -0.70472574 (56,True) (52,True) -0.6427097 -1.1588018 (61,True) (52,True) -0.21674097 -1.7891809 (60,True) (50,True) -0.3416797 -1.7019662 (57,True) (50,True) -0.21280245 -1.7588336 (59,False) (50,True) -0.2069609 -1.4886467 (62,True) (50,True) -0.8188009 -1.7384337 (59,True) (50,True) -0.3416797 -1.6806525 (55,False) (50,True) -0.46778375 -1.0561146 (55,True) (50,True) -0.61468095 -1.6748852 (65,True) (50,True) -0.46778375 -1.2991631 (53,True) (50,True) -0.6938622 -1.5444132 (52,True) (50,True) -0.44673255 -1.132982 (56,True) (50,True) -0.6913965 -1.797121 <s> (79,False) -0.44673255 -1.997398 ||| (79,False) -0.25595403 -1.6605904 ||| (79,True) -0.5144864 -1.5540351 (64,False) (56,False) -0.45961833 -1.8423254 (64,True) (56,False) -0.2069609 -2.0045412 (60,True) (56,False) -0.2069609 -1.8649764 (62,False) (56,False) -0.2069609 -1.2572598 (59,False) (56,False) -0.31838238 -1.8097129 (59,True) (56,False) -0.2069609 -1.662966 (71,False) (56,False) -0.2069609 -2.704639 <s> (74,False) -0.2069609 -1.8598757 ||| (74,False) -0.5846436 -1.8114918 (67,False) (74,False) -0.2069609 -1.2419332 (79,False) (74,False) -0.2069609 -1.5726457 (76,True) (74,False) -0.2069609 -0.3192652 (83,False) (74,False) -0.2069609 -0.77967626 <s> (76,False) -0.82507706 -1.7126337 (60,False) (76,False) -0.46778375 -1.6418167 ||| (76,False) -0.6720796 -1.6696999 (72,False) (76,False) -0.2069609 -1.0326067 (79,False) (76,False) -0.21674097 -1.2799276 (79,True) (76,False) -0.2069609 -0.3185667 (84,False) (76,False) -0.2069609 -1.2864366 ||| (76,True) -1.067977 -2.0334523 (60,True) (76,True) -0.3416797 -1.8869311 (62,False) (76,True) -0.2069609 -1.7515719 (72,True) (76,True) -0.21674097 -1.28636 (79,True) (76,True) -0.45731324 -0.3192652 (84,True) (76,True) -0.4385897 -2.7830493 <s> (77,False) -0.2069609 -2.1460195 ||| (77,False) -0.30060455 -1.8826777 ||| (77,True) -0.5153052 -1.9194332 (60,False) (56,True) -0.2069609 -1.7066501 (64,True) (56,True) -0.5635285 -1.910055 (62,False) (56,True) -0.2069609 -1.5450712 (62,True) (56,True) -0.36248344 -1.4919165 (59,True) (56,True) -0.45393372 -1.9132942 (59,False) (44,False) -0.2069609 -1.6799939 (52,False) (44,False) -0.58471775 -1.7024856 (59,True) (44,True) -0.46778375 -1.8349694 (52,True) (44,True) -0.94373965 -1.575649 (55,False) (40,False) -0.3416797 -1.6799939 (52,False) (40,False) -0.2069609 -1.3503643 (55,True) (40,True) -0.58471775 -1.8349694 (52,True) (40,True) -0.2069609 -1.6116482 (57,False) (41,False) -0.46778375 -1.9621799 (57,True) (41,False) -0.2069609 -1.93097 (55,True) (41,False) -0.2069609 -1.5787896 (53,False) (41,False) -0.2069609 -1.7947528 (52,True) (41,False) -0.2069609 -1.475743 ||| (74,True) -0.8188009 -2.0535953 (67,True) (74,True) -0.2069609 -1.3062491 (79,True) (74,True) -0.2069609 -2.7773485 <s> (36,False) -0.2069609 -1.5582856 (48,False) (36,False) -0.2069609 -1.4685993 (52,False) (36,False) -0.51777095 -2.5338948 ||| (36,True) -0.21674097 -1.849068 (48,True) (36,True) -0.2069609 -1.6303446 (52,True) (36,True) -0.88574773 -1.7823361 (55,False) (46,False) -0.2069609 -1.98162 (55,True) (46,False) -0.2069609 -1.3877308 (53,False) (38,False) -0.46778375 -1.5298299 (53,True) (38,True) -0.46778375 -1.7772404 (60,True) (58,False) -0.2069609 -1.8096367 (65,True) (58,False) -0.2069609 -2.7077413 ||| (63,False) -0.2069609 -1.2629664 (66,False) (63,False) -0.2069609 -1.9421479 (60,False) (54,False) -0.2069609 -1.928581 (60,True) (54,False) -0.2069609 -1.9859117 (57,True) (54,False) -0.2069609 -1.8720809 (59,True) (54,False) -0.2069609 -2.542226 ||| (63,True) -0.2069609 -1.2133304 (66,True) (63,True) -0.21674097 -1.9057122 (60,True) (54,True) -0.2069609 -1.9621799 (57,True) (54,True) -0.2069609 -1.8659605 (59,False) (54,True) -0.2069609 -1.8502812 (59,True) (54,True) -0.2069609 -0.7909216 (63,True) (54,True) -0.2069609 -1.70581 (69,True) (66,True) -0.3111852 -1.7349916 (71,False) (66,True) -0.2069609 -1.4030533 (71,True) (66,True) -0.24885151 -1.6177548 (69,False) (61,False) -0.2069609 -1.9813033 (64,False) (61,False) -0.2069609 -1.7093232 (69,True) (61,True) -0.30060455 -2.1106985 (64,True) (61,True) -0.30223465 -2.7830493 <s> (81,False) -0.2069609 -2.7077413 ||| (81,False) -0.46778375 -2.3609936 ||| (81,True) -0.3111852 -1.8015975 (57,False) (43,False) -0.2069609 -1.6839479 (59,False) (43,False) -0.46778375 -1.7524962 (55,False) (43,False) -0.2069609 -1.4498607 (47,True) (43,False) -0.2069609 -0.9128107 (58,False) (43,False) -0.2069609 -1.9621799 (57,True) (43,True) -0.2069609 -1.4919165 (59,True) (43,True) -0.36248344 -1.93097 (55,True) (43,True) -0.2069609 -1.5787896 (53,False) (43,True) -0.2069609 -1.4498607 (47,True) (43,True) -0.2069609 -2.1420734 (60,True) (58,True) -0.2069609 -1.8096367 (65,True) (58,True) -0.2069609 -2.0165992 (57,True) (41,True) -0.2069609 -1.533582 (53,True) (41,True) -0.46778375 -1.8057641 (72,True) (70,False) -0.2069609 -1.8057641 (72,True) (70,True) -0.2069609 -1.9699724 (55,True) (46,True) -0.46778375 -2.1566234 <s> (.) -0.46778375 -2.542226 ||| (.) -0.51777095 -2.6806846 ||| (75,False) -0.3416797 -2.1384277 ||| (75,True) -0.6427097 -1.8458076 (48,True) (33,False) -0.2069609 -1.8516587 (48,True) (33,True) -0.2069609 -1.6334816 (50,False) (33,True) -0.2069609 -2.7702308 <s> (84,False) -0.2069609 -2.3609936 ||| (84,True) -0.4385897 -2.6806846 ||| (83,False) -0.2069609 -1.9813033 (64,False) (49,False) -0.2069609 -1.838714 (57,False) (49,False) -0.2069609 -2.1106985 (64,True) (49,True) -0.21674097 -2.0165992 (57,True) (49,True) -0.21674097 \3-grams: -1.8776189 ||| (69,False) </s> -1.9470112 (72,False) (69,False) </s> -2.1680539 (67,False) (64,False) </s> -2.4316618 (64,False) (60,False) </s> -0.3985954 (67,True) (57,False) </s> -1.6296175 (60,False) ||| </s> -1.4106597 (57,False) ||| </s> -1.1538919 (60,True) ||| </s> -0.8235009 (57,True) ||| </s> -0.6941386 (62,False) ||| </s> -1.1818879 (59,False) ||| </s> -0.93829155 (59,True) ||| </s> -0.8584549 (67,False) ||| </s> -0.8988234 (55,False) ||| </s> -0.5438473 (55,True) ||| </s> -1.0234716 (53,False) ||| </s> -0.62630534 (53,True) ||| </s> -1.5330969 (45,False) ||| </s> -1.3844057 (45,True) ||| </s> -0.6249216 (47,False) ||| </s> -0.99343616 (47,True) ||| </s> -1.9040306 (48,False) ||| </s> -1.0650122 (48,True) ||| </s> -0.62202275 (50,False) ||| </s> -1.1730049 (52,False) ||| </s> -0.6849098 (52,True) ||| </s> -0.9226955 (50,True) ||| </s> -0.55417955 (56,False) ||| </s> -0.53338 (56,True) ||| </s> -0.70232636 (44,True) ||| </s> -0.3876514 (41,False) ||| </s> -0.608961 (46,False) ||| </s> -0.5721533 (43,True) ||| </s> -0.7378346 (41,True) ||| </s> -0.608961 (46,True) ||| </s> -2.2149072 ||| (69,True) </s> -1.4038078 (72,True) (69,True) </s> -0.3703692 (48,True) (69,True) </s> -0.9414102 (77,True) (69,True) </s> -2.2698648 ||| (64,True) </s> -1.8460037 (69,True) (64,True) </s> -1.6321228 (71,True) (64,True) </s> -2.09198 (67,True) (64,True) </s> -2.0835636 ||| (60,True) </s> -2.274721 (64,True) (60,True) </s> -2.101502 (67,True) (60,True) </s> -1.5924144 (65,True) (60,True) </s> -1.7912014 (64,True) (57,True) </s> -2.0900893 (60,True) (57,True) </s> -0.84066576 (72,True) (57,True) </s> -1.1677938 (69,True) (62,True) </s> -1.3457919 (64,True) (62,True) </s> -1.8702773 (67,True) (62,True) </s> -1.7447165 (62,True) (59,True) </s> -1.3628988 (67,True) (59,True) </s> -0.37692416 (69,True) (71,True) </s> -0.37692416 (77,True) (71,True) </s> -1.1312532 (71,True) (68,True) </s> -1.2626431 (76,True) (68,True) </s> -2.016163 ||| (72,False) </s> -0.3979069 (76,True) (67,False) </s> -2.3100648 ||| (72,True) </s> -2.121114 ||| (67,True) </s> -0.8902523 (69,True) (67,True) </s> -0.88830984 (64,True) (67,True) </s> -2.3509085 (72,True) (67,True) </s> -2.1449983 (60,True) (55,True) </s> -1.499522 (59,True) (55,True) </s> -0.3913239 (67,False) (55,True) </s> -1.2607485 ||| (65,False) </s> -1.4482795 (69,True) (65,True) </s> -1.3453368 (72,True) (65,True) </s> -0.3566621 (60,False) (53,True) </s> -0.77246386 (57,False) (53,True) </s> -1.0450131 (60,True) (53,True) </s> -1.4042128 (57,True) (53,True) </s> -0.64592904 (57,True) (45,False) </s> -1.6831414 (48,True) (45,True) </s> -1.4555241 (50,True) (47,True) </s> -1.6359617 (64,True) (48,True) </s> -2.0186143 (60,True) (48,True) </s> -0.38844848 (54,True) (48,True) </s> -1.3370194 (60,True) (52,True) </s> -1.7731538 (57,True) (52,True) </s> -1.70196 (55,True) (52,True) </s> -0.9400109 (57,True) (50,True) </s> -0.6753824 (52,True) (50,True) </s> -1.4820569 ||| (79,True) </s> -1.1534435 ||| (74,False) </s> -2.0278473 ||| (76,True) </s> -1.331011 (59,True) (56,True) </s> -1.0920873 (64,True) (61,True) </s> -0.7725904 (59,True) (43,True) </s> -0.45209706 (72,True) (70,True) </s> -0.409194 (76,True) (64,False) (69,False) -0.8516128 (64,True) ||| (69,False) -1.4759859 (57,True) ||| (69,False) -1.7848382 (59,False) ||| (69,False) -1.1985731 (62,True) ||| (69,False) -1.5261759 (59,True) ||| (69,False) -0.65193665 (55,True) ||| (69,False) -1.0984269 (45,True) ||| (69,False) -0.89160836 (47,True) ||| (69,False) -1.9453194 (48,True) ||| (69,False) -1.7835696 (52,True) ||| (69,False) -1.4765848 (50,True) ||| (69,False) -0.6314938 (49,True) ||| (69,False) -1.2095611 <s> (72,False) (69,False) -0.33224803 ||| (72,False) (69,False) -0.3405292 (74,False) (72,False) (69,False) -0.5385889 (76,False) (72,False) (69,False) -0.43081445 (77,False) (72,False) (69,False) -2.3768537 ||| (72,True) (69,False) -1.7694228 (60,False) (48,False) (69,False) -1.1373433 ||| (79,False) (69,False) -1.299192 ||| (79,True) (69,False) -0.38203248 <s> (74,False) (69,False) -0.62063515 <s> (76,False) (69,False) -0.66364026 ||| (76,False) (69,False) -2.1274712 ||| (76,True) (69,False) -0.7681661 ||| (77,False) (69,False) -0.27361572 <s> (81,False) (69,False) -0.063346505 <s> (69,False) (64,False) -0.30254555 ||| (69,False) (64,False) -0.2602319 (72,False) (69,False) (64,False) -0.33578387 (79,False) (69,False) (64,False) -0.9416703 (76,False) (69,False) (64,False) -0.33578387 (81,False) (69,False) (64,False) -1.1173948 (72,False) (60,False) (64,False) -2.0595188 (67,False) (60,False) (64,False) -2.4002059 (57,True) ||| (64,False) -1.4390274 (45,True) ||| (64,False) -0.7663953 (47,True) ||| (64,False) -1.4455541 (48,True) ||| (64,False) -1.3338119 (50,True) ||| (64,False) -1.1006792 (44,True) ||| (64,False) -1.0905218 (36,True) ||| (64,False) -0.6879296 (38,True) ||| (64,False) -1.1166706 (43,True) ||| (64,False) -2.203362 ||| (69,True) (64,False) -1.0423014 (77,True) (69,True) (64,False) -2.3769336 (67,True) (60,True) (64,False) -0.57360315 <s> (71,False) (64,False) -1.0911064 ||| (71,False) (64,False) -1.0121228 (74,False) (71,False) (64,False) -0.14807753 (76,False) (71,False) (64,False) -0.48923492 (71,False) (68,False) (64,False) -0.32910907 (72,False) (68,False) (64,False) -1.7735263 ||| (71,True) (64,False) -1.0906823 (74,True) (71,True) (64,False) -0.7284403 <s> (72,False) (64,False) -1.1115282 ||| (72,False) (64,False) -0.23552603 (79,False) (72,False) (64,False) -1.5616658 (76,False) (72,False) (64,False) -0.3280084 (76,True) (72,False) (64,False) -0.25104967 <s> (67,False) (64,False) -0.3307809 (69,False) (67,False) (64,False) -0.4775623 ||| (67,False) (64,False) -0.55696034 (69,True) (67,False) (64,False) -0.19766727 (72,False) (67,False) (64,False) -0.55696034 (48,False) (67,False) (64,False) -1.0807337 (74,False) (67,False) (64,False) -2.617622 ||| (72,True) (64,False) -0.4667676 (81,True) (72,True) (64,False) -1.8630148 ||| (67,True) (64,False) -1.5291144 (69,True) (65,True) (64,False) -1.3362745 ||| (76,False) (64,False) -2.3514018 ||| (76,True) (64,False) -1.5565772 <s> (69,False) (60,False) -1.098308 ||| (69,False) (60,False) -0.1372168 (76,False) (69,False) (60,False) -0.79891056 (77,False) (69,False) (60,False) -0.17330438 <s> (64,False) (60,False) -0.2158411 (69,False) (64,False) (60,False) -0.205613 ||| (64,False) (60,False) -0.312653 (69,True) (64,False) (60,False) -0.4593504 (72,False) (64,False) (60,False) -0.17745633 (67,False) (64,False) (60,False) -0.76060176 (72,True) (64,False) (60,False) -2.0841396 (45,True) ||| (60,False) -1.5080531 (47,True) ||| (60,False) -1.7376724 (48,True) ||| (60,False) -1.5982069 (36,True) ||| (60,False) -0.7038887 (38,True) ||| (60,False) -2.644038 (69,True) (64,True) (60,False) -1.4896619 (69,True) (62,False) (60,False) -1.6570177 (65,True) (62,True) (60,False) -1.5717574 (76,True) (71,True) (60,False) -1.9349968 <s> (72,False) (60,False) -1.5921359 ||| (72,False) (60,False) -1.6579945 (76,False) (72,False) (60,False) -0.8240092 (77,False) (72,False) (60,False) -0.67191917 <s> (67,False) (60,False) -0.70278925 (64,False) (67,False) (60,False) -0.48436385 ||| (67,False) (60,False) -0.5321518 (72,False) (67,False) (60,False) -0.5826478 (48,False) (67,False) (60,False) -0.15137792 (76,False) (67,False) (60,False) -2.3114724 ||| (67,True) (60,False) -1.475662 (71,True) (67,True) (60,False) -1.2834736 (74,True) (67,True) (60,False) -0.6585014 <s> (65,False) (60,False) -0.64328015 (69,False) (65,False) (60,False) -0.8145644 ||| (65,False) (60,False) -0.96018755 (71,True) (65,True) (60,False) -0.39449802 (72,False) (76,False) (60,False) -0.27283496 ||| (63,False) (60,False) -0.6803438 (72,False) (69,False) (57,False) -1.3596032 <s> (64,False) (57,False) -0.5182746 (69,False) (64,False) (57,False) -0.609538 (60,False) (64,False) (57,False) -1.1562947 ||| (64,False) (57,False) -0.7302051 (72,False) (64,False) (57,False) -0.609538 (76,False) (64,False) (57,False) -1.5208367 <s> (60,False) (57,False) -0.25631723 (69,False) (60,False) (57,False) -0.44063956 (64,False) (60,False) (57,False) -0.4048058 ||| (60,False) (57,False) -0.53838134 (72,False) (60,False) (57,False) -1.4427922 (67,False) (60,False) (57,False) -0.49940515 (67,True) (60,False) (57,False) -0.76186514 (65,False) (60,False) (57,False) -1.544856 (47,True) ||| (57,False) -2.4871924 ||| (64,True) (57,False) -2.045044 (72,True) (64,True) (57,False) -1.834099 ||| (60,True) (57,False) -2.6759126 (64,True) (60,True) (57,False) -1.9459449 (67,True) (60,True) (57,False) -0.1687654 <s> (62,False) (57,False) -1.038169 (69,False) (62,False) (57,False) -1.2224656 (67,True) (62,False) (57,False) -1.1081378 (65,False) (62,False) (57,False) -1.1917093 (69,True) (62,True) (57,False) -1.9010417 (76,False) (72,False) (57,False) -0.6987688 (72,False) (67,True) (57,False) -0.657624 <s> (65,False) (57,False) -1.5592878 (69,False) (65,False) (57,False) -0.8308104 (72,False) (65,False) (57,False) -1.8478698 (69,True) (65,True) (57,False) -0.9365636 (71,False) (66,False) (57,False) -0.85788935 (71,True) (66,True) (57,False) -0.56750214 (64,False) (61,False) (57,False) -0.3794111 (60,True) (64,False) ||| -1.7598786 (67,False) (64,False) ||| -0.36612022 (65,True) (64,False) ||| -1.343661 (69,False) (60,False) ||| -0.52345055 (64,False) (60,False) ||| -0.3326272 (64,True) (60,False) ||| -0.3326272 (62,True) (60,False) ||| -0.41146725 (67,False) (60,False) ||| -0.755692 (65,False) (60,False) ||| -0.3326272 (76,False) (60,False) ||| -0.96307 <s> (57,False) ||| -0.039118707 (69,False) (57,False) ||| -0.13407877 (64,False) (57,False) ||| -0.1760606 (60,False) (57,False) ||| -0.591339 (60,True) (57,False) ||| -0.67863137 (62,False) (57,False) ||| -0.25219345 (72,False) (57,False) ||| -0.5977708 (65,False) (57,False) ||| -0.25219345 (66,False) (57,False) ||| -0.24464577 (66,True) (57,False) ||| -0.25219345 (61,False) (57,False) ||| -2.1626432 (67,True) (64,True) ||| -0.15623024 (69,False) (60,True) ||| -1.6137229 (69,True) (60,True) ||| -0.5189251 (64,True) (60,True) ||| -0.34760177 (59,False) (60,True) ||| -0.34760177 (59,True) (60,True) ||| -0.45681265 (67,True) (60,True) ||| -1.3712379 (65,True) (60,True) ||| -0.33590066 (76,True) (60,True) ||| -0.35835195 (64,False) (57,True) ||| -0.23192067 (60,False) (57,True) ||| -1.173934 ||| (57,True) ||| -0.019692454 (69,True) (57,True) ||| -0.18946324 (64,True) (57,True) ||| -0.18034503 (60,True) (57,True) ||| -0.20947477 (62,False) (57,True) ||| -0.100659646 (59,False) (57,True) ||| -0.5783799 (62,True) (57,True) ||| -0.12392822 (59,True) (57,True) ||| -0.12392822 (67,False) (57,True) ||| -0.23819233 (72,True) (57,True) ||| -0.12392822 (67,True) (57,True) ||| -0.12392822 (65,False) (57,True) ||| -0.40883547 (65,True) (57,True) ||| -0.23895814 (56,False) (57,True) ||| -0.11470289 (66,True) (57,True) ||| -0.23895814 (61,True) (57,True) ||| -1.0669794 (64,True) (62,False) ||| -0.7626311 (65,False) (62,False) ||| -0.6405622 (66,False) (62,False) ||| -0.48326486 (69,True) (59,False) ||| -0.2063867 (64,True) (59,False) ||| -0.17061663 (60,True) (59,False) ||| -0.2854724 (62,False) (59,False) ||| -0.4249277 (67,False) (59,False) ||| -0.25795084 (67,True) (59,False) ||| -0.28551212 (65,True) (59,False) ||| -0.28551212 (45,True) (59,False) ||| -0.27661207 (66,False) (59,False) ||| -0.28551212 (63,False) (59,False) ||| -0.86216366 (65,True) (62,True) ||| -0.63981193 (66,True) (62,True) ||| -0.30625293 (60,False) (59,True) ||| -0.6174316 (69,True) (59,True) ||| -0.7885179 (64,True) (59,True) ||| -0.15293728 (60,True) (59,True) ||| -0.22873996 (62,True) (59,True) ||| -0.430302 (67,True) (59,True) ||| -0.2964594 (63,True) (59,True) ||| -0.2964594 (66,True) (59,True) ||| -1.9291799 ||| (72,False) ||| -0.7717465 (64,False) (67,False) ||| -1.3291124 ||| (67,False) ||| -1.2723486 (74,False) (67,False) ||| -2.271199 ||| (72,True) ||| -1.920043 ||| (67,True) ||| -0.9042281 (64,True) (67,True) ||| -0.64135575 (64,False) (55,False) ||| -0.21311384 (64,True) (55,False) ||| -0.13756241 (60,True) (55,False) ||| -0.3441605 (57,True) (55,False) ||| -0.3545049 (62,False) (55,False) ||| -0.26738697 (59,False) (55,False) ||| -0.21942526 (59,True) (55,False) ||| -0.5270959 (67,False) (55,False) ||| -0.21942526 (65,False) (55,False) ||| -0.21942526 (45,True) (55,False) ||| -0.21942526 (61,False) (55,False) ||| -0.21942526 (61,True) (55,False) ||| -0.6256218 (64,True) (55,True) ||| -1.2891089 (60,True) (55,True) ||| -0.4178603 (57,True) (55,True) ||| -0.4448473 (62,True) (55,True) ||| -0.388151 (59,True) (55,True) ||| -0.6480608 (67,True) (55,True) ||| -0.32373816 (45,True) (55,True) ||| -0.31315905 (61,True) (55,True) ||| -0.79447865 (69,False) (65,False) ||| -0.22603168 (69,False) (53,False) ||| -0.06995231 (60,False) (53,False) ||| -0.16949172 (57,False) (53,False) ||| -0.45106438 (60,True) (53,False) ||| -0.557889 (62,False) (53,False) ||| -0.10933018 (59,False) (53,False) ||| -0.22913222 (59,True) (53,False) ||| -0.09601951 (65,False) (53,False) ||| -0.87345254 (69,True) (65,True) ||| -0.09998841 (64,False) (53,True) ||| -0.21355823 (57,False) (53,True) ||| -0.19831057 (69,True) (53,True) ||| -0.15065305 (60,True) (53,True) ||| -0.1341406 (57,True) (53,True) ||| -0.20407294 (62,False) (53,True) ||| -0.32016614 (59,False) (53,True) ||| -0.6489086 (62,True) (53,True) ||| -0.19831057 (59,True) (53,True) ||| -0.20407294 (55,False) (53,True) ||| -0.6330032 (55,True) (53,True) ||| -0.050597817 (65,True) (53,True) ||| -0.075008556 (69,False) (45,False) ||| -0.07318918 (64,False) (45,False) ||| -0.0070241997 (60,False) (45,False) ||| -0.008501961 (57,False) (45,False) ||| -0.18585831 (57,True) (45,False) ||| -0.075008556 (55,False) (45,False) ||| -0.017173743 (48,False) (45,False) ||| -0.018769156 (52,False) (45,False) ||| -0.075008556 (54,False) (45,False) ||| -0.075879 (60,False) (45,True) ||| -0.074036695 (69,True) (45,True) ||| -0.05431105 (64,True) (45,True) ||| -0.011756131 (60,True) (45,True) ||| -0.003597477 (57,True) (45,True) ||| -0.074036695 (62,False) (45,True) ||| -0.035442546 (59,False) (45,True) ||| -0.074036695 (62,True) (45,True) ||| -0.035442546 (59,True) (45,True) ||| -0.075879 (55,False) (45,True) ||| -0.075879 (55,True) (45,True) ||| -0.075879 (53,False) (45,True) ||| -0.075879 (48,False) (45,True) ||| -0.020401757 (48,True) (45,True) ||| -0.009834765 (52,True) (45,True) ||| -0.18698217 (54,True) (45,True) ||| -0.05431105 (61,True) (45,True) ||| -0.03370306 (64,True) (47,False) ||| -0.019906411 (60,True) (47,False) ||| -0.03370306 (57,True) (47,False) ||| -0.019906411 (62,False) (47,False) ||| -0.019906411 (59,False) (47,False) ||| -0.034501944 (62,True) (47,False) ||| -0.025028937 (55,False) (47,False) ||| -0.03370306 (55,True) (47,False) ||| -0.034501944 (48,True) (47,False) ||| -0.007548704 (50,False) (47,False) ||| -0.025028937 (52,True) (47,False) ||| -0.034501944 (56,False) (47,False) ||| -0.034501944 (54,False) (47,False) ||| -0.09586522 (64,True) (47,True) ||| -0.09348313 (60,True) (47,True) ||| -0.09586522 (57,True) (47,True) ||| -0.044231076 (62,True) (47,True) ||| -0.0681593 (59,True) (47,True) ||| -0.07456052 (55,True) (47,True) ||| -0.09586522 (48,True) (47,True) ||| -0.049948435 (52,True) (47,True) ||| -0.03749993 (50,True) (47,True) ||| -0.049948435 (56,True) (47,True) ||| -0.049948435 (54,True) (47,True) ||| -0.16616084 <s> (48,False) ||| -0.026039558 (64,False) (48,False) ||| -0.027034627 (60,False) (48,False) ||| -0.05816351 (57,False) (48,False) ||| -0.2272188 (60,True) (48,False) ||| -0.06208853 (67,False) (48,False) ||| -0.025115158 (55,False) (48,False) ||| -0.16616084 (53,False) (48,False) ||| -0.10698303 (52,False) (48,False) ||| -0.16616084 (52,True) (48,False) ||| -0.15002982 (64,False) (48,True) ||| -0.15002982 (57,False) (48,True) ||| -0.15002982 ||| (48,True) ||| -0.030891865 (64,True) (48,True) ||| -0.022042617 (60,True) (48,True) ||| -0.06382935 (57,True) (48,True) ||| -0.08163355 (62,False) (48,True) ||| -0.15002982 (59,False) (48,True) ||| -0.104687266 (62,True) (48,True) ||| -0.022459166 (67,True) (48,True) ||| -0.15002982 (55,False) (48,True) ||| -0.017721793 (55,True) (48,True) ||| -0.14605752 (65,False) (48,True) ||| -0.04919686 (53,False) (48,True) ||| -0.14605752 (65,True) (48,True) ||| -0.043447122 (53,True) (48,True) ||| -0.15002982 (52,False) (48,True) ||| -0.10575026 (52,True) (48,True) ||| -0.15002982 (56,False) (48,True) ||| -0.2853688 (54,False) (48,True) ||| -0.10735555 (60,False) (50,False) ||| -0.05558058 (57,False) (50,False) ||| -0.041805156 (60,True) (50,False) ||| -0.16122831 (57,True) (50,False) ||| -0.028835736 (62,False) (50,False) ||| -0.05558058 (59,False) (50,False) ||| -0.05558058 (62,True) (50,False) ||| -0.10735555 (59,True) (50,False) ||| -0.10735555 (67,True) (50,False) ||| -0.12182978 (55,True) (50,False) ||| -0.05558058 (65,False) (50,False) ||| -0.036354084 (53,False) (50,False) ||| -0.4349445 (52,True) (50,False) ||| -0.19321482 (56,False) (50,False) ||| -0.05558058 (56,True) (50,False) ||| -0.11144664 (64,False) (52,False) ||| -0.20261335 (60,False) (52,False) ||| -0.1965283 (60,True) (52,False) ||| -0.35019422 (57,True) (52,False) ||| -0.1965283 (62,False) (52,False) ||| -0.24430203 (59,False) (52,False) ||| -0.09671597 (62,True) (52,False) ||| -0.09671597 (67,False) (52,False) ||| -0.4587221 (55,False) (52,False) ||| -0.1965283 (53,True) (52,False) ||| -0.13483986 (56,False) (52,False) ||| -0.2641791 (60,False) (52,True) ||| -0.2641791 (57,False) (52,True) ||| -0.111229755 (64,True) (52,True) ||| -0.24691173 (60,True) (52,True) ||| -0.24741672 (62,False) (52,True) ||| -0.24741672 (59,False) (52,True) ||| -0.22990538 (59,True) (52,True) ||| -0.2561564 (67,True) (52,True) ||| -0.5881493 (55,True) (52,True) ||| -0.07940205 (56,True) (52,True) ||| -0.10189774 (60,True) (50,True) ||| -0.24643013 (57,True) (50,True) ||| -0.145814 (59,False) (50,True) ||| -0.031382464 (62,True) (50,True) ||| -0.10189774 (59,True) (50,True) ||| -0.07387943 (55,False) (50,True) ||| -0.26502883 (55,True) (50,True) ||| -0.07387943 (65,True) (50,True) ||| -0.04236828 (53,True) (50,True) ||| -0.058025587 (56,True) (50,True) ||| -0.24227704 (64,False) (56,False) ||| -0.41679728 (64,True) (56,False) ||| -0.40697438 (59,False) (56,False) ||| -0.24219342 (59,True) (56,False) ||| -0.24219342 (71,False) (56,False) ||| -1.7618787 <s> (76,False) ||| -2.1440952 ||| (76,True) ||| -0.32662395 (60,False) (56,True) ||| -0.34722212 (64,True) (56,True) ||| -0.60042655 (59,True) (56,True) ||| -0.18359107 (59,False) (44,False) ||| -0.06775899 (52,False) (44,False) ||| -0.091029495 (59,True) (44,True) ||| -0.028353449 (52,True) (44,True) ||| -0.12656476 (55,False) (40,False) ||| -0.18359107 (52,False) (40,False) ||| -0.06775899 (55,True) (40,True) ||| -0.18359107 (52,True) (40,True) ||| -0.050079055 (57,False) (41,False) ||| -0.09612999 (57,True) (41,False) ||| -0.09612999 (55,True) (41,False) ||| -0.09612999 (53,False) (41,False) ||| -0.09612999 (52,True) (41,False) ||| -0.17453259 <s> (36,False) ||| -0.17453259 (48,False) (36,False) ||| -0.0766438 (52,False) (36,False) ||| -0.1697753 ||| (36,True) ||| -0.17453259 (48,True) (36,True) ||| -0.031207 (52,True) (36,True) ||| -0.18359107 (55,False) (46,False) ||| -0.18359107 (55,True) (46,False) ||| -0.07759853 (53,False) (38,False) ||| -0.07759853 (53,True) (38,True) ||| -0.64272904 (60,True) (58,False) ||| -0.33037886 (59,True) (54,False) ||| -0.3385345 (59,True) (54,True) ||| -0.5363594 (64,False) (61,False) ||| -0.7340876 (64,True) (61,True) ||| -0.09612999 (57,False) (43,False) ||| -0.050079055 (59,False) (43,False) ||| -0.09612999 (55,False) (43,False) ||| -0.09612999 (47,True) (43,False) ||| -0.09612999 (58,False) (43,False) ||| -0.13333999 (57,True) (43,True) ||| -0.16187681 (59,True) (43,True) ||| -0.13333999 (55,True) (43,True) ||| -0.13333999 (53,False) (43,True) ||| -0.13333999 (47,True) (43,True) ||| -0.25637916 (60,True) (58,True) ||| -0.18359107 (57,True) (41,True) ||| -0.091029495 (53,True) (41,True) ||| -0.07759853 (55,True) (46,True) ||| -0.15385582 (48,True) (33,False) ||| -0.18359107 (48,True) (33,True) ||| -0.18359107 (50,False) (33,True) ||| -0.18359107 (64,False) (49,False) ||| -0.18359107 (57,False) (49,False) ||| -0.17853256 (64,True) (49,True) ||| -0.17853256 (57,True) (49,True) ||| -1.155094 (60,False) ||| (69,True) -0.51885104 (57,False) ||| (69,True) -1.4168962 (60,True) ||| (69,True) -0.70706314 (57,True) ||| (69,True) -1.1235306 (62,False) ||| (69,True) -1.0200881 (59,False) ||| (69,True) -1.0969198 (62,True) ||| (69,True) -1.4013814 (59,True) ||| (69,True) -0.75272226 (55,False) ||| (69,True) -0.39745277 (53,False) ||| (69,True) -0.4971006 (53,True) ||| (69,True) -0.5039649 (45,False) ||| (69,True) -0.664252 (45,True) ||| (69,True) -0.77352065 (47,False) ||| (69,True) -1.1877378 (48,False) ||| (69,True) -1.3497866 (48,True) ||| (69,True) -0.75692433 (50,False) ||| (69,True) -0.8288079 (50,True) ||| (69,True) -0.37551355 (61,False) ||| (69,True) -0.16588028 (61,True) ||| (69,True) -0.97756225 (43,False) ||| (69,True) -1.0045283 (43,True) ||| (69,True) -0.16588028 (49,False) ||| (69,True) -0.40736637 (49,True) ||| (69,True) -2.1148536 ||| (72,False) (69,True) -0.6292634 ||| (72,True) (69,True) -0.59815717 (76,True) (72,True) (69,True) -0.22873096 (77,True) (72,True) (69,True) -2.115821 (60,True) (48,True) (69,True) -1.1400788 ||| (79,False) (69,True) -1.5565165 ||| (79,True) (69,True) -0.64322567 ||| (76,True) (69,True) -0.7348361 ||| (77,False) (69,True) -0.62409294 ||| (77,True) (69,True) -1.3134494 ||| (74,True) (69,True) -0.7073219 ||| (81,True) (69,True) -0.39771912 <s> (.) (69,True) -0.38610145 ||| (.) (69,True) -1.8768396 ||| (69,False) (64,True) -0.6599774 (72,True) (69,False) (64,True) -0.807967 (76,True) (69,False) (64,True) -1.3631141 (57,False) ||| (64,True) -1.6891232 (57,True) ||| (64,True) -0.83689797 (55,False) ||| (64,True) -1.3133507 (55,True) ||| (64,True) -0.5583006 (45,False) ||| (64,True) -0.62532634 (45,True) ||| (64,True) -1.3521014 (47,False) ||| (64,True) -0.7186331 (48,False) ||| (64,True) -1.0363104 (48,True) ||| (64,True) -1.1100943 (50,False) ||| (64,True) -1.1085439 (52,False) ||| (64,True) -1.2633151 (52,True) ||| (64,True) -1.2395093 (50,True) ||| (64,True) -0.104195915 (44,False) ||| (64,True) -0.27978134 (44,True) ||| (64,True) -0.5394402 (40,False) ||| (64,True) -0.7308844 (40,True) ||| (64,True) -1.1168119 (36,False) ||| (64,True) -1.3881798 (36,True) ||| (64,True) -0.64076596 (46,False) ||| (64,True) -0.9900193 (43,False) ||| (64,True) -0.64076596 (46,True) ||| (64,True) -0.16513278 ||| (69,True) (64,True) -0.32384968 (72,False) (69,True) (64,True) -0.29830268 (72,True) (69,True) (64,True) -0.32384968 (79,False) (69,True) (64,True) -0.32384968 (79,True) (69,True) (64,True) -1.0288965 (76,True) (69,True) (64,True) -0.32384968 (81,True) (69,True) (64,True) -0.092969745 (.) (69,True) (64,True) -0.8486538 (72,True) (60,True) (64,True) -2.3349206 (67,True) (60,True) (64,True) -0.72549134 ||| (71,False) (64,True) -0.38313493 (69,True) (71,False) (64,True) -1.1065 (74,False) (71,False) (64,True) -0.8781328 (71,False) (68,False) (64,True) -0.45495152 ||| (71,True) (64,True) -0.15000269 (76,True) (71,True) (64,True) -0.643421 (74,True) (71,True) (64,True) -0.16261266 (71,True) (68,True) (64,True) -0.3398196 (72,True) (68,True) (64,True) -0.6818863 (69,True) (67,False) (64,True) -1.1058011 (72,True) (67,False) (64,True) -0.9341167 ||| (72,True) (64,True) -0.35252163 (67,False) (72,True) (64,True) -0.35252163 (67,True) (72,True) (64,True) -0.15242106 (79,True) (72,True) (64,True) -1.3864354 (76,True) (72,True) (64,True) -0.3612352 (69,False) (67,True) (64,True) -0.3838385 ||| (67,True) (64,True) -0.45600802 (69,True) (67,True) (64,True) -0.60952663 (72,False) (67,True) (64,True) -0.20197399 (72,True) (67,True) (64,True) -0.59855443 (48,True) (67,True) (64,True) -1.388443 (74,True) (67,True) (64,True) -1.1292386 ||| (79,False) (64,True) -1.5419941 ||| (79,True) (64,True) -2.116284 ||| (76,True) (64,True) -0.46283692 (72,True) (70,False) (64,True) -0.46283692 (72,True) (70,True) (64,True) -0.39690056 (64,False) (69,False) (60,True) -0.8290293 (76,True) (69,False) (60,True) -1.8114872 ||| (64,False) (60,True) -0.8487923 (69,True) (64,False) (60,True) -0.93314844 (67,True) (64,False) (60,True) -1.2688146 (53,False) ||| (60,True) -1.5020912 (53,True) ||| (60,True) -1.1627109 (45,False) ||| (60,True) -1.3037531 (45,True) ||| (60,True) -1.4200187 (47,False) ||| (60,True) -0.79361784 (48,False) ||| (60,True) -0.96450275 (48,True) ||| (60,True) -1.4360183 (50,False) ||| (60,True) -1.8561219 (52,False) ||| (60,True) -0.5514705 (40,False) ||| (60,True) -0.76023585 (40,True) ||| (60,True) -1.0695089 (41,False) ||| (60,True) -0.37964454 (36,False) ||| (60,True) -0.32979178 (36,True) ||| (60,True) -0.66487795 (38,False) ||| (60,True) -1.3319618 ||| (69,True) (60,True) -0.15581225 (76,True) (69,True) (60,True) -1.0138347 (77,True) (69,True) (60,True) -0.2443507 ||| (64,True) (60,True) -0.2124087 (69,True) (64,True) (60,True) -1.0924525 (71,False) (64,True) (60,True) -0.55172825 (72,True) (64,True) (60,True) -0.20656294 (67,True) (64,True) (60,True) -1.2451885 ||| (62,False) (60,True) -1.4506913 (69,True) (62,False) (60,True) -1.1957029 (67,True) (59,False) (60,True) -1.3252758 ||| (62,True) (60,True) -1.4417622 (67,True) (59,True) (60,True) -0.3998583 (77,True) (71,False) (60,True) -1.7669383 ||| (72,True) (60,True) -2.0383253 (76,True) (72,True) (60,True) -1.2303972 (77,True) (72,True) (60,True) -0.50882787 ||| (67,True) (60,True) -0.79236025 (64,True) (67,True) (60,True) -0.31325507 (71,False) (67,True) (60,True) -1.2178029 (71,True) (67,True) (60,True) -0.6440995 (72,True) (67,True) (60,True) -0.88950574 (48,True) (67,True) (60,True) -0.7622926 (74,False) (67,True) (60,True) -0.13949774 (76,True) (67,True) (60,True) -0.8118829 ||| (65,False) (60,True) -0.46241537 (72,True) (65,False) (60,True) -0.6827525 (67,True) (65,False) (60,True) -0.2945401 ||| (65,True) (60,True) -0.70223624 (69,True) (65,True) (60,True) -0.6287658 (72,True) (65,True) (60,True) -0.74438953 (67,True) (65,True) (60,True) -0.32402068 ||| (66,False) (60,True) -0.14775857 (69,True) (66,False) (60,True) -0.32402068 (72,True) (66,False) (60,True) -0.3822994 (72,True) (76,True) (60,True) -0.5283337 ||| (63,True) (60,True) -0.9520549 (69,True) (66,True) (60,True) -1.4084709 ||| (64,False) (57,True) -1.3698235 (71,False) (64,False) (57,True) -1.6680257 (72,False) (64,False) (57,True) -2.1108088 (64,False) (60,False) (57,True) -0.40265614 (65,True) (60,False) (57,True) -2.258901 (57,False) ||| (57,True) -2.1562083 (57,True) ||| (57,True) -1.042205 (45,False) ||| (57,True) -1.1640787 (45,True) ||| (57,True) -1.0240668 (47,False) ||| (57,True) -1.7473811 (47,True) ||| (57,True) -1.5936179 (48,False) ||| (57,True) -1.8547817 (48,True) ||| (57,True) -1.4828099 (50,False) ||| (57,True) -0.40123188 (33,False) ||| (57,True) -0.70327663 (72,True) (69,True) (57,True) -0.6747661 (69,False) (64,True) (57,True) -1.0679832 ||| (64,True) (57,True) -0.62342125 (69,True) (64,True) (57,True) -0.3018099 (60,True) (64,True) (57,True) -0.8801567 (71,False) (64,True) (57,True) -1.3331774 (71,True) (64,True) (57,True) -0.56123316 (67,False) (64,True) (57,True) -0.50869554 (72,True) (64,True) (57,True) -0.7308459 (76,True) (64,True) (57,True) -0.3333141 (70,False) (64,True) (57,True) -0.3333141 (70,True) (64,True) (57,True) -0.76959914 ||| (60,True) (57,True) -0.19280395 (69,True) (60,True) (57,True) -0.49563703 (64,True) (60,True) (57,True) -0.34788138 (71,False) (60,True) (57,True) -0.7244432 (72,True) (60,True) (57,True) -1.6754981 (67,True) (60,True) (57,True) -0.22263 (65,False) (60,True) (57,True) -0.36077833 (65,True) (60,True) (57,True) -0.22485915 (66,False) (60,True) (57,True) -0.34788138 (66,True) (60,True) (57,True) -0.9340264 (69,True) (62,False) (57,True) -1.0770801 (64,True) (62,False) (57,True) -0.76027393 (71,False) (62,False) (57,True) -0.164073 (72,True) (62,False) (57,True) -1.0269171 (65,False) (62,False) (57,True) -1.1718386 (64,False) (59,False) (57,True) -1.1123241 (64,True) (59,False) (57,True) -1.3907143 (62,False) (59,False) (57,True) -0.77820426 ||| (62,True) (57,True) -1.0711172 (69,True) (62,True) (57,True) -0.9535345 (64,True) (62,True) (57,True) -0.36870992 (72,True) (62,True) (57,True) -0.9487641 (65,True) (62,True) (57,True) -1.6534077 (64,True) (59,True) (57,True) -1.4553132 (62,True) (59,True) (57,True) -1.2746375 (71,False) (67,False) (57,True) -0.42099553 (72,True) (67,False) (57,True) -1.8561258 (76,True) (72,True) (57,True) -1.4970235 (71,True) (67,True) (57,True) -2.0481548 (72,True) (67,True) (57,True) -0.48443466 (69,True) (65,False) (57,True) -0.8257879 (71,False) (65,False) (57,True) -1.386379 ||| (65,True) (57,True) -1.530609 (69,True) (65,True) (57,True) -0.8422948 (71,True) (65,True) (57,True) -0.9238394 (72,True) (65,True) (57,True) -0.3756995 (76,True) (66,False) (57,True) -0.65327746 (64,True) (56,False) (57,True) -0.81887686 (71,True) (66,True) (57,True) -1.1255352 (64,True) (61,True) (57,True) -2.0096323 <s> (69,False) (62,False) -1.2444576 ||| (69,False) (62,False) -2.5096357 (45,True) ||| (62,False) -1.7572333 (48,True) ||| (62,False) -0.883435 (41,True) ||| (62,False) -1.5271282 ||| (69,True) (62,False) -1.5899603 (76,True) (69,True) (62,False) -0.17230378 (77,False) (69,True) (62,False) -1.2709478 ||| (64,True) (62,False) -1.8689766 (69,True) (64,True) (62,False) -0.76708484 (71,False) (64,True) (62,False) -1.9102178 (72,True) (64,True) (62,False) -1.1732341 ||| (71,False) (62,False) -0.9261106 (76,True) (71,False) (62,False) -0.78729427 (71,False) (68,False) (62,False) -0.16260386 (76,True) (68,False) (62,False) -0.94034886 <s> (67,False) (62,False) -0.91134626 ||| (67,False) (62,False) -0.304888 (71,False) (67,False) (62,False) -0.4563007 (79,False) (67,False) (62,False) -0.41787288 (74,False) (67,False) (62,False) -2.1395829 (76,True) (72,True) (62,False) -1.2736202 (77,True) (72,True) (62,False) -1.9685949 ||| (67,True) (62,False) -0.8384343 (71,False) (67,True) (62,False) -1.619256 (72,True) (67,True) (62,False) -1.7599002 (76,True) (67,True) (62,False) -0.5654043 (69,False) (65,False) (62,False) -0.51430076 ||| (65,False) (62,False) -0.55713296 (69,True) (65,False) (62,False) -0.29868636 (60,True) (65,False) (62,False) -0.60207945 (71,False) (65,False) (62,False) -0.29868636 (67,False) (65,False) (62,False) -0.65833515 (72,True) (65,False) (62,False) -0.88626015 (67,True) (65,False) (62,False) -0.9750131 (71,False) (65,True) (62,False) -0.16681086 (69,False) (66,False) (62,False) -0.3814992 (67,False) (74,False) (62,False) -0.81248796 <s> (64,False) (59,False) -0.8489846 ||| (64,False) (59,False) -0.93806803 (71,False) (64,False) (59,False) -1.4343958 (67,False) (64,False) (59,False) -0.6307534 (76,False) (64,False) (59,False) -2.6896524 (48,True) ||| (59,False) -0.713446 (33,True) ||| (59,False) -2.2201746 (72,True) (69,True) (59,False) -1.9730163 (76,True) (69,True) (59,False) -2.1220686 ||| (64,True) (59,False) -1.8915734 (69,True) (64,True) (59,False) -1.0131975 (71,False) (64,True) (59,False) -0.36742592 (68,False) (64,True) (59,False) -1.707768 (72,True) (64,True) (59,False) -1.4000878 (67,True) (64,True) (59,False) -0.36742592 (79,False) (64,True) (59,False) -2.2254417 ||| (60,True) (59,False) -2.2316499 (64,True) (60,True) (59,False) -1.9459449 (67,True) (60,True) (59,False) -0.5592584 (69,False) (62,False) (59,False) -0.6700111 ||| (62,False) (59,False) -0.3288643 (69,True) (62,False) (59,False) -0.45652795 (64,True) (62,False) (59,False) -0.65537715 (71,False) (62,False) (59,False) -0.35553354 (68,False) (62,False) (59,False) -0.3584026 (67,False) (62,False) (59,False) -0.7528159 (67,True) (62,False) (59,False) -0.32437372 (74,False) (62,False) (59,False) -1.3052329 ||| (62,True) (59,False) -1.5997684 (65,True) (62,True) (59,False) -1.2760401 (76,False) (71,False) (59,False) -0.9223501 (76,True) (71,False) (59,False) -0.13997073 (76,False) (68,False) (59,False) -1.8101712 ||| (67,False) (59,False) -0.8029767 (74,False) (67,False) (59,False) -2.1900702 ||| (67,True) (59,False) -1.9950732 (72,True) (67,True) (59,False) -1.0437572 (48,True) (67,True) (59,False) -1.7547375 (76,True) (67,True) (59,False) -1.221897 (69,False) (65,False) (59,False) -1.2247403 ||| (65,False) (59,False) -1.1190327 (69,True) (65,False) (59,False) -1.8478698 (69,True) (65,True) (59,False) -0.68577415 (54,True) (45,True) (59,False) -0.55963665 (71,False) (66,False) (59,False) -0.27244508 (66,False) (63,False) (59,False) -1.956213 ||| (69,False) (62,True) -0.38455364 (79,True) (69,False) (62,True) -0.9752116 (67,True) (64,False) (62,True) -1.8902943 (47,False) ||| (62,True) -1.8625543 (47,True) ||| (62,True) -2.0427947 (48,True) ||| (62,True) -1.5299873 (50,False) ||| (62,True) -1.1364464 (43,False) ||| (62,True) -1.1453605 (43,True) ||| (62,True) -1.1824366 ||| (69,True) (62,True) -1.5745173 (76,True) (69,True) (62,True) -1.4245237 ||| (64,True) (62,True) -2.2440767 (69,True) (64,True) (62,True) -1.4159802 (71,True) (64,True) (62,True) -1.5082211 ||| (71,True) (62,True) -1.1608607 (71,True) (68,True) (62,True) -1.0227288 (76,True) (68,True) (62,True) -2.206546 (76,True) (72,True) (62,True) -0.88673484 ||| (67,True) (62,True) -0.2703596 (71,True) (67,True) (62,True) -1.8161188 (72,True) (67,True) (62,True) -0.5512983 (79,True) (67,True) (62,True) -1.6482688 (76,True) (67,True) (62,True) -0.44145778 (74,True) (67,True) (62,True) -0.4045247 (71,True) (65,False) (62,True) -0.7008542 ||| (65,True) (62,True) -0.55250704 (69,True) (65,True) (62,True) -0.3180855 (60,True) (65,True) (62,True) -0.76073426 (71,False) (65,True) (62,True) -0.70677364 (71,True) (65,True) (62,True) -0.82425463 (72,True) (65,True) (62,True) -0.6962 (67,True) (65,True) (62,True) -0.37826854 (71,True) (66,False) (62,True) -0.351707 (67,True) (74,True) (62,True) -0.2860478 (69,True) (66,True) (62,True) -0.3159873 (71,False) (66,True) (62,True) -0.899544 (71,True) (66,True) (62,True) -0.84971637 (76,True) (69,False) (59,True) -0.688864 (71,True) (64,False) (59,True) -0.958845 (67,True) (64,False) (59,True) -2.5338492 (64,False) (60,False) (59,True) -2.0137792 (47,False) ||| (59,True) -0.71380705 (33,True) ||| (59,True) -2.2260234 (72,True) (69,True) (59,True) -1.5728321 (76,True) (69,True) (59,True) -0.71999663 ||| (64,True) (59,True) -0.8845514 (71,True) (64,True) (59,True) -1.7661777 (72,True) (64,True) (59,True) -1.0937802 (67,True) (64,True) (59,True) -0.3764792 (79,True) (64,True) (59,True) -0.3293785 (76,True) (64,True) (59,True) -2.4626012 (64,True) (60,True) (59,True) -1.9740297 (67,True) (60,True) (59,True) -1.5660437 (64,True) (62,False) (59,True) -1.363208 (67,True) (62,False) (59,True) -0.42204157 (69,False) (62,True) (59,True) -0.715402 ||| (62,True) (59,True) -0.44342807 (69,True) (62,True) (59,True) -0.47405982 (64,True) (62,True) (59,True) -0.5611576 (71,True) (62,True) (59,True) -0.42204157 (68,True) (62,True) (59,True) -0.38636437 (67,True) (62,True) (59,True) -0.33326933 (74,True) (62,True) (59,True) -1.1176565 (76,True) (71,True) (59,True) -0.15759914 (76,True) (68,True) (59,True) -1.8827798 ||| (67,True) (59,True) -2.1002874 (72,True) (67,True) (59,True) -1.0022799 (48,True) (67,True) (59,True) -1.6982486 (76,True) (67,True) (59,True) -0.6084059 (74,True) (67,True) (59,True) -1.5575898 ||| (65,True) (59,True) -1.2908337 (69,True) (65,True) (59,True) -0.30466047 (66,True) (63,True) (59,True) -0.8593098 (71,True) (66,True) (59,True) -2.068077 (60,True) ||| (71,False) -1.6580974 (57,True) ||| (71,False) -1.9575496 (53,True) ||| (71,False) -2.0507524 (45,True) ||| (71,False) -1.7244412 (48,True) ||| (71,False) -2.2266195 (52,True) ||| (71,False) -1.5810344 (50,True) ||| (71,False) -2.6293273 ||| (69,True) (71,False) -1.4897629 (74,False) (67,False) (71,False) -0.6546924 ||| (74,False) (71,False) -0.36426574 (76,True) (74,False) (71,False) -1.8378193 <s> (76,False) (71,False) -0.72644866 ||| (76,False) (71,False) -1.9508994 ||| (76,True) (71,False) -1.2079617 ||| (77,True) (71,False) -0.116889 ||| (75,False) (71,False) -0.6735332 <s> (71,False) (68,False) -1.1938524 ||| (71,False) (68,False) -2.1571393 ||| (72,False) (68,False) -1.3416421 <s> (76,False) (68,False) -1.3180058 ||| (76,False) (68,False) -1.8276104 ||| (76,True) (68,False) -2.143956 (57,False) ||| (71,True) -1.8135034 (57,True) ||| (71,True) -1.4597325 (59,False) ||| (71,True) -1.4448279 (59,True) ||| (71,True) -0.85543036 (55,False) ||| (71,True) -0.95741993 (55,True) ||| (71,True) -1.852569 (45,True) ||| (71,True) -1.6446731 (47,False) ||| (71,True) -2.135768 (48,True) ||| (71,True) -1.7133311 (50,False) ||| (71,True) -1.2297884 (52,False) ||| (71,True) -1.1587738 (52,True) ||| (71,True) -1.0540031 (50,True) ||| (71,True) -0.92446 (56,False) ||| (71,True) -1.0066679 (56,True) ||| (71,True) -1.0370317 (43,False) ||| (71,True) -1.0579168 (43,True) ||| (71,True) -2.6470873 ||| (69,True) (71,True) -1.7593007 (74,True) (67,True) (71,True) -1.1483305 ||| (76,True) (71,True) -1.2112774 ||| (77,True) (71,True) -0.79838586 ||| (74,True) (71,True) -0.054696813 ||| (75,True) (71,True) -0.7575091 ||| (71,True) (68,True) -2.7982948 ||| (72,True) (68,True) -1.1751726 ||| (76,True) (68,True) -1.0607364 (60,True) ||| (72,False) -1.4778285 (57,True) ||| (72,False) -0.7443603 (62,True) ||| (72,False) -0.59595084 (59,True) ||| (72,False) -0.83530486 (67,True) ||| (72,False) -1.6744224 (53,False) ||| (72,False) -1.570405 (45,True) ||| (72,False) -1.7246914 (47,True) ||| (72,False) -1.3342851 (48,True) ||| (72,False) -1.4889516 (52,True) ||| (72,False) -0.9917551 (50,True) ||| (72,False) -1.4589181 (56,True) ||| (72,False) -0.31197265 <s> (79,False) (72,False) -1.0466194 ||| (79,False) (72,False) -1.5446162 ||| (74,False) (72,False) -0.31880936 <s> (76,False) (72,False) -0.4574374 ||| (76,False) (72,False) -0.3216827 (79,False) (76,False) (72,False) -0.33267513 (79,True) (76,False) (72,False) -2.1467814 ||| (76,True) (72,False) -0.31820875 <s> (77,False) (72,False) -0.6995995 ||| (77,False) (72,False) -0.12941742 ||| (81,False) (72,False) -2.0527925 <s> (69,False) (67,False) -1.380553 (72,False) (64,False) (67,False) -2.0066772 (60,True) ||| (67,False) -2.126397 (57,True) ||| (67,False) -0.8512662 (72,True) ||| (67,False) -0.83244747 (67,True) ||| (67,False) -1.824024 (53,True) ||| (67,False) -1.779813 (45,True) ||| (67,False) -1.390321 (47,True) ||| (67,False) -1.4718518 (48,True) ||| (67,False) -1.782541 (52,True) ||| (67,False) -0.8070178 (50,True) ||| (67,False) -1.1690292 (40,True) ||| (67,False) -1.5007695 (36,True) ||| (67,False) -2.5179446 ||| (69,True) (67,False) -2.2319522 (72,True) (69,True) (67,False) -0.64296204 ||| (71,False) (67,False) -1.1116056 (74,False) (71,False) (67,False) -0.8909824 (76,True) (71,False) (67,False) -0.15873991 <s> (72,False) (67,False) -0.48579127 ||| (72,False) (67,False) -0.26328364 (76,False) (72,False) (67,False) -2.3352647 ||| (72,True) (67,False) -1.6268747 (76,True) (72,True) (67,False) -1.7458453 (64,False) (48,False) (67,False) -0.38667905 (72,False) (48,False) (67,False) -0.59634984 ||| (79,False) (67,False) -1.5491946 ||| (79,True) (67,False) -0.3321343 ||| (74,False) (67,False) -0.33370563 (79,False) (74,False) (67,False) -0.33370563 (83,False) (74,False) (67,False) -0.88691664 <s> (76,False) (67,False) -0.14995702 (60,False) (76,False) (67,False) -1.3852143 ||| (76,False) (67,False) -0.33006182 (84,False) (76,False) (67,False) -1.1830703 (79,True) (76,True) (67,False) -0.31450677 (64,False) ||| (72,True) -0.33334473 (60,False) ||| (72,True) -0.48867252 (57,False) ||| (72,True) -0.32791397 (64,True) ||| (72,True) -0.4648254 (60,True) ||| (72,True) -0.7065462 (57,True) ||| (72,True) -0.7131102 (62,False) ||| (72,True) -0.585476 (59,False) ||| (72,True) -0.37414637 (72,False) ||| (72,True) -0.89139843 (67,False) ||| (72,True) -0.32791397 (72,True) ||| (72,True) -0.7700381 (67,True) ||| (72,True) -1.4398484 (55,False) ||| (72,True) -0.14406149 (65,False) ||| (72,True) -0.9214516 (53,False) ||| (72,True) -0.1033253 (65,True) ||| (72,True) -1.4181737 (53,True) ||| (72,True) -1.2171195 (45,False) ||| (72,True) -1.2285659 (45,True) ||| (72,True) -1.5174514 (47,False) ||| (72,True) -0.6861791 (48,False) ||| (72,True) -0.8819494 (48,True) ||| (72,True) -0.7104 (50,False) ||| (72,True) -0.54438514 (52,False) ||| (72,True) -0.79607177 (52,True) ||| (72,True) -0.4090719 (79,True) (67,False) (72,True) -1.0781194 (79,True) (67,True) (72,True) -0.41725355 ||| (79,True) (72,True) -0.3846109 ||| (76,True) (72,True) -0.21305938 (79,True) (76,True) (72,True) -0.7377487 ||| (77,False) (72,True) -0.31253663 ||| (77,True) (72,True) -0.25571817 ||| (81,True) (72,True) -0.39870906 <s> (.) (72,True) -0.38696036 ||| (.) (72,True) -0.68925315 (72,True) (69,False) (67,True) -1.0881617 (64,False) ||| (67,True) -1.537573 (60,False) ||| (67,True) -1.4240896 (60,True) ||| (67,True) -1.6030575 (59,False) ||| (67,True) -1.3908541 (59,True) ||| (67,True) -0.443824 (67,False) ||| (67,True) -1.2120197 (55,False) ||| (67,True) -1.3442013 (55,True) ||| (67,True) -1.5195533 (53,False) ||| (67,True) -0.8996238 (47,False) ||| (67,True) -0.685975 (47,True) ||| (67,True) -0.7029816 (48,False) ||| (67,True) -0.7898623 (48,True) ||| (67,True) -1.4080604 (50,False) ||| (67,True) -0.5004047 (52,False) ||| (67,True) -0.579726 (52,True) ||| (67,True) -0.99689066 (40,False) ||| (67,True) -1.0669274 (40,True) ||| (67,True) -1.11749 (36,False) ||| (67,True) -1.3890458 (36,True) ||| (67,True) -0.6410714 (38,False) ||| (67,True) -0.99070215 (43,False) ||| (67,True) -2.0640466 ||| (69,True) (67,True) -1.4554454 (72,True) (64,True) (67,True) -1.4454433 ||| (71,False) (67,True) -1.1090453 (74,False) (71,False) (67,True) -0.88924426 (76,True) (71,False) (67,True) -0.69362 ||| (71,True) (67,True) -1.4671102 (76,True) (71,True) (67,True) -0.6844098 (74,True) (71,True) (67,True) -2.027513 ||| (72,False) (67,True) -1.8499761 (76,False) (72,False) (67,True) -0.28851557 ||| (72,True) (67,True) -0.248001 (76,True) (72,True) (67,True) -0.16424802 (77,False) (72,True) (67,True) -0.10264757 (.) (72,True) (67,True) -1.4678447 (72,True) (65,False) (67,True) -1.7063638 (64,True) (48,True) (67,True) -0.38762712 (72,True) (48,True) (67,True) -0.97371334 ||| (79,True) (67,True) -1.2161965 ||| (74,False) (67,True) -0.9553529 ||| (76,True) (67,True) -0.22291924 (60,True) (76,True) (67,True) -0.3443759 (62,False) (76,True) (67,True) -0.16824643 (84,True) (76,True) (67,True) -0.15656808 ||| (74,True) (67,True) -0.31500098 (79,True) (74,True) (67,True) -0.46344143 (72,True) (70,False) (67,True) -1.7900506 <s> (64,False) (55,False) -0.97244793 (71,False) (64,False) (55,False) -0.7553815 (72,False) (64,False) (55,False) -2.0483105 (67,False) (64,False) (55,False) -0.06357473 <s> (60,False) (55,False) -1.0320643 (64,False) (60,False) (55,False) -0.60986125 ||| (60,False) (55,False) -0.95264995 (72,False) (60,False) (55,False) -0.98954546 (67,False) (60,False) (55,False) -1.1467208 (65,False) (60,False) (55,False) -2.2391586 (69,True) (64,True) (55,False) -1.8217765 (71,True) (64,True) (55,False) -1.7489086 (64,True) (60,True) (55,False) -0.47228163 (64,False) (57,True) (55,False) -2.1638184 (60,True) (57,True) (55,False) -0.37893772 (67,False) (62,False) (55,False) -1.5503093 (65,False) (62,False) (55,False) -0.9619032 (64,False) (59,False) (55,False) -1.4472866 (64,True) (59,False) (55,False) -1.3696723 (62,False) (59,False) (55,False) -0.57570136 (67,False) (59,False) (55,False) -2.04506 (64,True) (59,True) (55,False) -1.3865333 ||| (67,False) (55,False) -0.7946235 (71,False) (67,False) (55,False) -1.3802829 (74,False) (67,False) (55,False) -1.4716833 (72,True) (65,False) (55,False) -2.1011636 (60,True) (45,True) (55,False) -0.33791754 (65,True) (58,False) (55,False) -0.5690423 (69,False) (61,False) (55,False) -1.1372826 (64,True) (61,True) (55,False) -0.96850055 (67,True) (64,False) (55,True) -2.391073 (64,False) (60,False) (55,True) -1.4177289 ||| (60,False) (55,True) -1.0113287 (67,True) (60,False) (55,True) -1.0441471 (60,True) (57,False) (55,True) -2.3237855 ||| (64,True) (55,True) -0.9077693 (71,True) (64,True) (55,True) -0.7987496 (72,True) (64,True) (55,True) -2.1547782 (67,True) (64,True) (55,True) -0.7812898 (64,False) (60,True) (55,True) -0.1592929 ||| (60,True) (55,True) -0.9748055 (64,True) (60,True) (55,True) -0.8249103 (72,True) (60,True) (55,True) -1.0358093 (67,True) (60,True) (55,True) -1.5328144 (65,True) (60,True) (55,True) -1.8480848 (64,True) (57,True) (55,True) -2.1544945 (60,True) (57,True) (55,True) -0.5903721 ||| (62,False) (55,True) -1.1388012 (64,True) (62,False) (55,True) -0.9776453 (65,False) (59,False) (55,True) -0.5980128 ||| (62,True) (55,True) -0.35674143 (67,True) (62,True) (55,True) -0.36912552 (65,False) (62,True) (55,True) -1.3191404 (65,True) (62,True) (55,True) -0.36912552 (66,False) (62,True) (55,True) -0.61260927 (64,False) (59,True) (55,True) -0.7612037 (64,True) (59,True) (55,True) -1.3376602 (62,True) (59,True) (55,True) -0.5824578 (67,True) (59,True) (55,True) -0.925704 (65,True) (59,True) (55,True) -1.1245561 (72,True) (67,False) (55,True) -1.8236465 ||| (67,True) (55,True) -1.0753572 (71,True) (67,True) (55,True) -1.6381732 (74,True) (67,True) (55,True) -1.070945 (72,True) (65,False) (55,True) -1.0667888 (72,True) (65,True) (55,True) -2.0980563 (60,True) (45,True) (55,True) -0.6809249 (60,True) (58,False) (55,True) -0.4948392 (69,True) (61,True) (55,True) -1.0271685 (64,True) (61,True) (55,True) -0.27166644 (65,True) (58,True) (55,True) -0.6139677 ||| (69,False) (65,False) -0.86634254 (72,False) (69,False) (65,False) -0.37284464 (48,False) (69,False) (65,False) -0.32709548 (77,False) (69,False) (65,False) -2.475219 (60,True) ||| (65,False) -2.2507184 (57,True) ||| (65,False) -2.0133126 (53,True) ||| (65,False) -2.0668612 (48,True) ||| (65,False) -1.5659691 (50,True) ||| (65,False) -2.255035 ||| (69,True) (65,False) -1.7200963 (72,True) (69,True) (65,False) -2.4155602 (67,True) (60,True) (65,False) -1.4607861 ||| (71,False) (65,False) -0.3858479 (67,False) (71,False) (65,False) -1.1193784 (74,False) (71,False) (65,False) -1.8815732 ||| (71,True) (65,False) -2.0443096 ||| (72,False) (65,False) -0.17299375 (81,False) (72,False) (65,False) -1.8777918 ||| (67,False) (65,False) -1.4525921 ||| (72,True) (65,False) -2.0432458 ||| (67,True) (65,False) -2.217155 (72,True) (67,True) (65,False) -0.34598923 (74,False) (67,True) (65,False) -2.0870445 (72,False) (69,False) (53,False) -1.28051 (69,False) (60,False) (53,False) -2.4322476 (64,False) (60,False) (53,False) -0.52151513 (65,False) (60,False) (53,False) -1.656218 (64,False) (57,False) (53,False) -1.2711656 (60,False) (57,False) (53,False) -0.86969566 (60,True) (57,False) (53,False) -0.65883493 (62,False) (57,False) (53,False) -0.31787407 (65,False) (57,False) (53,False) -1.3423325 (72,True) (60,True) (53,False) -1.4548187 (67,True) (60,True) (53,False) -0.6367734 (69,False) (62,False) (53,False) -1.574124 (65,False) (62,False) (53,False) -1.4650426 (62,False) (59,False) (53,False) -2.0131915 (64,True) (59,True) (53,False) -1.4767239 (62,True) (59,True) (53,False) -1.6246667 (60,True) (55,True) (53,False) -0.42787904 (62,False) (55,True) (53,False) -1.0758436 (69,False) (65,False) (53,False) -0.34430033 (72,False) (65,False) (53,False) -2.1690466 (57,True) ||| (65,True) -1.3197196 (53,False) ||| (65,True) -1.0152047 (53,True) ||| (65,True) -1.9301641 (48,False) ||| (65,True) -1.5431718 (50,False) ||| (65,True) -1.5182871 (50,True) ||| (65,True) -1.1259488 (41,False) ||| (65,True) -1.1115713 (43,False) ||| (65,True) -0.85225093 (41,True) ||| (65,True) -1.017524 ||| (69,True) (65,True) -0.8560893 (72,True) (69,True) (65,True) -0.5517838 (77,True) (69,True) (65,True) -2.4491432 (67,True) (60,True) (65,True) -1.1875635 ||| (71,False) (65,True) -0.738146 (74,False) (71,False) (65,True) -1.4306712 ||| (71,True) (65,True) -0.37726295 (67,True) (71,True) (65,True) -1.0506971 (74,True) (71,True) (65,True) -1.5130969 ||| (72,True) (65,True) -0.469749 (81,True) (72,True) (65,True) -1.7021286 ||| (67,True) (65,True) -2.227392 (72,True) (67,True) (65,True) -1.2536485 (74,True) (67,True) (65,True) -0.3496059 (72,True) (64,False) (53,True) -0.40938416 (62,False) (60,False) (53,True) -0.17435186 (62,True) (57,False) (53,True) -0.40103403 (65,True) (57,False) (53,True) -1.9595592 (72,True) (69,True) (53,True) -1.109964 (69,True) (60,True) (53,True) -0.67464334 (62,False) (60,True) (53,True) -1.7441047 (67,True) (60,True) (53,True) -0.6043764 (65,True) (60,True) (53,True) -1.9744859 (64,True) (57,True) (53,True) -1.2009639 (60,True) (57,True) (53,True) -1.2366552 (62,False) (57,True) (53,True) -0.84353364 (62,True) (57,True) (53,True) -0.5386953 (65,True) (57,True) (53,True) -0.40887436 (65,True) (62,False) (53,True) -1.2488897 (62,False) (59,False) (53,True) -0.96995187 (65,False) (59,False) (53,True) -0.8335274 (69,True) (62,True) (53,True) -1.615137 (65,True) (62,True) (53,True) -1.5324043 (62,True) (59,True) (53,True) -0.40595362 (58,False) (55,False) (53,True) -1.9463596 (60,True) (55,True) (53,True) -1.1166854 (62,True) (55,True) (53,True) -0.3995255 (58,True) (55,True) (53,True) -1.030964 (69,True) (65,True) (53,True) -0.4540254 (71,False) (65,True) (53,True) -0.98480153 (72,True) (65,True) (53,True) -2.0870445 (72,False) (69,False) (45,False) -1.9847281 (69,False) (64,False) (45,False) -0.8271018 (69,False) (60,False) (45,False) -1.0123193 (64,False) (60,False) (45,False) -1.5840544 (64,False) (57,False) (45,False) -0.7682241 (60,False) (57,False) (45,False) -2.2658145 (64,True) (57,True) (45,False) -2.5571654 (60,True) (57,True) (45,False) -1.3568144 (60,True) (55,False) (45,False) -1.3659676 (57,False) (48,False) (45,False) -0.37160602 (55,True) (48,False) (45,False) -0.7359963 (52,False) (48,False) (45,False) -0.97175336 (60,False) (52,False) (45,False) -0.7715901 (57,False) (52,False) (45,False) -0.38291278 (61,False) (52,False) (45,False) -0.3541983 (60,False) (54,False) (45,False) -2.521888 (64,False) (60,False) (45,True) -1.9469903 (72,True) (69,True) (45,True) -2.0670085 (69,True) (64,True) (45,True) -1.1237096 (69,True) (60,True) (45,True) -0.9754734 (64,True) (60,True) (45,True) -1.0264624 (64,True) (57,True) (45,True) -0.78064066 (60,True) (57,True) (45,True) -0.83205956 (62,False) (57,True) (45,True) -0.86822724 (62,True) (57,True) (45,True) -1.1402609 (64,True) (62,False) (45,True) -1.5366232 (65,False) (62,False) (45,True) -1.0980994 (62,False) (59,False) (45,True) -0.6837709 (71,False) (59,False) (45,True) -1.0038222 (64,True) (62,True) (45,True) -1.5947641 (65,True) (62,True) (45,True) -1.1339504 (62,True) (59,True) (45,True) -0.68202937 (71,True) (59,True) (45,True) -1.3441702 (60,True) (55,False) (45,True) -2.3423362 (60,True) (55,True) (45,True) -1.1828532 (60,True) (53,False) (45,True) -0.93540365 (60,True) (48,False) (45,True) -1.8966833 (60,True) (48,True) (45,True) -1.4554747 (57,True) (48,True) (45,True) -1.9106376 (55,True) (48,True) (45,True) -0.72793335 (52,True) (48,True) (45,True) -0.60265666 (54,False) (48,True) (45,True) -0.99568945 (60,True) (52,True) (45,True) -0.77744704 (57,True) (52,True) (45,True) -0.9525946 (59,False) (52,True) (45,True) -0.35922348 (61,True) (52,True) (45,True) -0.5533277 (60,True) (54,True) (45,True) -0.32861927 (63,True) (54,True) (45,True) -0.59506273 (64,True) (61,True) (45,True) -2.2419338 (69,True) (64,True) (47,False) -2.5945606 (67,True) (64,True) (47,False) -2.0315347 (69,True) (60,True) (47,False) -2.2622118 (64,True) (60,True) (47,False) -2.2300198 (60,True) (57,True) (47,False) -1.3475999 (69,True) (62,False) (47,False) -1.087015 (64,True) (62,False) (47,False) -1.0457175 (68,False) (62,False) (47,False) -1.6509516 (67,False) (62,False) (47,False) -0.6870897 (69,True) (59,False) (47,False) -1.2488897 (62,False) (59,False) (47,False) -1.6686572 (65,True) (62,True) (47,False) -0.78426564 (62,False) (55,False) (47,False) -2.2309945 (60,True) (55,True) (47,False) -1.101356 (62,False) (55,True) (47,False) -1.694638 (62,True) (55,True) (47,False) -2.2797256 (52,True) (48,True) (47,False) -0.71783316 (57,True) (50,False) (47,False) -0.31061617 (55,False) (50,False) (47,False) -0.71990025 (55,True) (50,False) (47,False) -0.24268284 (52,True) (50,False) (47,False) -0.7671707 (56,False) (50,False) (47,False) -1.8375105 (57,True) (52,True) (47,False) -1.0145108 (62,False) (52,True) (47,False) -1.7309959 (55,True) (52,True) (47,False) -0.38816744 (62,False) (56,False) (47,False) -0.59365606 (60,True) (54,False) (47,False) -2.6562335 (67,True) (64,True) (47,True) -2.0410264 (69,True) (60,True) (47,True) -2.4430313 (64,True) (60,True) (47,True) -2.6027918 (60,True) (57,True) (47,True) -0.37204623 (64,False) (62,True) (47,True) -1.3748331 (69,True) (62,True) (47,True) -0.9265051 (64,True) (62,True) (47,True) -0.85540026 (68,True) (62,True) (47,True) -1.7705228 (67,True) (62,True) (47,True) -0.8470951 (69,True) (59,True) (47,True) -1.5117104 (62,True) (59,True) (47,True) -0.53627133 (62,True) (55,True) (47,True) -2.2833004 (52,True) (48,True) (47,True) -0.4014265 (62,True) (52,True) (47,True) -2.161681 (55,True) (52,True) (47,True) -0.78286517 (57,True) (50,True) (47,True) -0.41959238 (55,True) (50,True) (47,True) -0.29579264 (52,True) (50,True) (47,True) -1.2134386 (56,True) (50,True) (47,True) -0.33696926 (62,True) (56,True) (47,True) -0.5582833 (60,True) (54,True) (47,True) -0.33156633 (59,False) (54,True) (47,True) -1.6856439 (69,False) (64,False) (48,False) -0.6562916 (60,False) (64,False) (48,False) -1.2623218 (72,False) (64,False) (48,False) -0.7416507 (67,False) (64,False) (48,False) -1.051172 (64,False) (60,False) (48,False) -1.0977569 (72,False) (60,False) (48,False) -1.2946886 (67,False) (60,False) (48,False) -0.9894667 (64,False) (57,False) (48,False) -1.5027325 (60,False) (57,False) (48,False) -0.66694486 (64,True) (57,False) (48,False) -0.82989204 (64,False) (60,True) (48,False) -2.1619325 ||| (60,True) (48,False) -2.5825372 (64,True) (60,True) (48,False) -2.1976466 (67,True) (60,True) (48,False) -1.9155334 (76,False) (72,False) (48,False) -0.82257557 (64,False) (67,False) (48,False) -1.6658981 (72,False) (67,False) (48,False) -0.928123 (76,False) (67,False) (48,False) -0.3484187 (64,False) (55,False) (48,False) -0.5118809 (60,False) (55,False) (48,False) -0.9481203 (62,False) (55,False) (48,False) -0.8659187 (60,False) (55,True) (48,False) -1.4530287 (57,False) (53,False) (48,False) -1.0434179 (64,False) (52,False) (48,False) -0.7376343 (60,False) (52,False) (48,False) -0.16453147 (57,False) (52,False) (48,False) -0.5571987 (57,True) (52,False) (48,False) -0.30866185 (55,False) (52,False) (48,False) -1.9708109 (57,True) (52,True) (48,False) -2.2259102 (67,False) (64,False) (48,True) -0.6871724 (64,True) (57,False) (48,True) -2.466435 (48,False) ||| (48,True) -1.6994767 (69,True) (64,True) (48,True) -0.78836805 (60,True) (64,True) (48,True) -1.0040532 (71,False) (64,True) (48,True) -1.489347 (71,True) (64,True) (48,True) -0.61679626 (67,False) (64,True) (48,True) -1.1141317 (72,True) (64,True) (48,True) -0.7264446 (67,True) (64,True) (48,True) -2.1245499 ||| (60,True) (48,True) -1.0653087 (64,True) (60,True) (48,True) -1.2315859 (72,True) (60,True) (48,True) -1.0799547 (67,True) (60,True) (48,True) -1.4868867 ||| (57,True) (48,True) -0.9593366 (64,True) (57,True) (48,True) -1.8125516 (60,True) (57,True) (48,True) -1.3373904 (67,True) (62,False) (48,True) -0.94935125 (65,False) (62,False) (48,True) -1.588437 (64,True) (59,False) (48,True) -1.9540409 (67,True) (62,True) (48,True) -1.2561916 (65,True) (62,True) (48,True) -1.847916 (76,True) (72,True) (48,True) -0.93893385 (64,True) (67,True) (48,True) -1.469342 (72,True) (67,True) (48,True) -1.0393779 (76,True) (67,True) (48,True) -1.4237928 (62,False) (55,False) (48,True) -0.37091637 (64,False) (55,True) (48,True) -0.76204515 (60,False) (55,True) (48,True) -0.35645652 (64,True) (55,True) (48,True) -0.5836798 (60,True) (55,True) (48,True) -1.2453828 (62,True) (55,True) (48,True) -0.8219323 (71,False) (65,False) (48,True) -0.6918239 (67,True) (65,False) (48,True) -0.75520897 (60,True) (53,False) (48,True) -0.42271578 (55,True) (53,False) (48,True) -0.9270885 (71,True) (65,True) (48,True) -0.78835046 (67,True) (65,True) (48,True) -1.0883142 (60,True) (53,True) (48,True) -1.4201354 (57,True) (53,True) (48,True) -0.87950903 (59,False) (53,True) (48,True) -0.5013543 (55,True) (53,True) (48,True) -1.8681358 (55,False) (52,False) (48,True) -1.41072 (64,True) (52,True) (48,True) -0.68464917 (60,True) (52,True) (48,True) -0.31136242 (57,True) (52,True) (48,True) -0.28840655 (55,True) (52,True) (48,True) -0.38400966 (60,True) (56,False) (48,True) -0.5254971 (60,True) (54,False) (48,True) -0.31181672 (57,True) (54,False) (48,True) -0.35694903 (57,True) (54,True) (48,True) -2.0339096 <s> (69,False) (66,False) -0.4023468 (74,False) (69,False) (66,False) -2.7918837 (48,True) ||| (66,False) -2.2687054 ||| (69,True) (66,False) -1.0964286 <s> (71,False) (66,False) -0.2522258 (75,False) (71,False) (66,False) -1.9038123 ||| (71,True) (66,False) -2.76344 ||| (72,True) (66,False) -2.4124303 ||| (76,True) (66,False) -1.3765506 (65,False) (60,False) (50,False) -0.69834214 (62,False) (57,False) (50,False) -2.2543187 (64,True) (60,True) (50,False) -0.94465643 (65,False) (60,True) (50,False) -1.8243097 (64,True) (57,True) (50,False) -2.4488573 (60,True) (57,True) (50,False) -0.39979997 (66,False) (57,True) (50,False) -1.3403661 (69,True) (62,False) (50,False) -0.9156925 (67,True) (62,False) (50,False) -0.77245426 (65,False) (62,False) (50,False) -0.6508749 (66,False) (62,False) (50,False) -0.46901426 (65,False) (59,False) (50,False) -1.2527215 (65,True) (62,True) (50,False) -2.0331888 (64,True) (59,True) (50,False) -0.40934736 (65,False) (67,True) (50,False) -0.60180783 (67,False) (55,False) (50,False) -1.4084553 (64,True) (55,True) (50,False) -1.8084906 (60,True) (55,True) (50,False) -0.37313682 (59,False) (55,True) (50,False) -1.3830323 (59,True) (55,True) (50,False) -0.36016834 (65,False) (55,True) (50,False) -0.7031418 (67,True) (65,False) (50,False) -0.89697486 (57,False) (53,False) (50,False) -0.9437336 (60,True) (53,False) (50,False) -0.30762067 (62,False) (53,False) (50,False) -0.7243293 (55,True) (53,False) (50,False) -1.5349225 (64,True) (52,True) (50,False) -0.9863545 (57,True) (52,True) (50,False) -1.1633267 (64,False) (56,False) (50,False) -0.77546406 (59,False) (56,False) (50,False) -0.9977066 (59,True) (56,True) (50,False) -1.8726966 <s> (64,False) (52,False) -0.25242978 (68,False) (64,False) (52,False) -1.8475144 (67,False) (64,False) (52,False) -1.24178 (69,False) (60,False) (52,False) -1.9961672 (64,False) (60,False) (52,False) -1.2883139 ||| (60,False) (52,False) -0.9963109 (72,False) (60,False) (52,False) -0.45607734 (67,False) (60,False) (52,False) -0.13375273 <s> (57,False) (52,False) -1.4833391 (64,False) (57,False) (52,False) -1.470512 (60,False) (57,False) (52,False) -0.3611971 ||| (57,False) (52,False) -0.8700608 (64,False) (60,True) (52,False) -1.9652663 ||| (57,True) (52,False) -1.0749271 (65,True) (57,True) (52,False) -1.1414223 (68,False) (62,False) (52,False) -0.40851066 (64,False) (59,False) (52,False) -0.1522564 (68,False) (59,False) (52,False) -1.2595661 (65,True) (62,True) (52,False) -1.8903046 (72,False) (67,False) (52,False) -0.82363427 (64,False) (55,False) (52,False) -0.23585583 (60,False) (55,False) (52,False) -1.1461753 (62,False) (55,False) (52,False) -0.804971 (59,False) (55,False) (52,False) -0.84118265 (67,False) (55,False) (52,False) -1.6468898 (57,True) (53,True) (52,False) -0.7636118 (64,False) (56,False) (52,False) -0.7393152 (59,False) (56,False) (52,False) -0.56981444 (69,False) (61,False) (52,False) -1.0645099 (67,True) (60,False) (52,True) -1.0529532 (60,True) (57,False) (52,True) -0.824371 (69,False) (64,True) (52,True) -2.0681913 ||| (64,True) (52,True) -0.08367334 (68,True) (64,True) (52,True) -2.1657407 (67,True) (64,True) (52,True) -2.089686 ||| (60,True) (52,True) -1.2054199 (69,True) (60,True) (52,True) -2.304751 (64,True) (60,True) (52,True) -1.208104 (72,True) (60,True) (52,True) -0.5275179 (67,True) (60,True) (52,True) -0.09969812 ||| (57,True) (52,True) -1.6523706 (64,True) (57,True) (52,True) -1.446002 (60,True) (57,True) (52,True) -1.466386 (69,True) (62,False) (52,True) -0.74230915 (67,True) (62,False) (52,True) -1.3873904 (64,False) (59,False) (52,True) -1.3778129 (64,True) (59,False) (52,True) -1.082463 (60,True) (59,False) (52,True) -1.5171741 (62,False) (59,False) (52,True) -1.0459247 (67,True) (59,False) (52,True) -1.6428545 (69,True) (62,True) (52,True) -0.47174478 (64,True) (59,True) (52,True) -0.64318126 (62,False) (59,True) (52,True) -0.056582995 (68,True) (59,True) (52,True) -1.2918767 (67,True) (59,True) (52,True) -2.241693 (72,True) (67,True) (52,True) -0.4073345 (70,False) (67,True) (52,True) -0.7407688 (60,False) (55,True) (52,True) -1.0930254 (64,True) (55,True) (52,True) -0.2666505 (60,True) (55,True) (52,True) -1.4488705 (62,True) (55,True) (52,True) -0.7715822 (59,True) (55,True) (52,True) -1.0853963 (67,True) (55,True) (52,True) -0.7881996 (64,True) (56,True) (52,True) -0.29962078 (62,False) (56,True) (52,True) -0.6736214 (62,True) (56,True) (52,True) -0.8186574 (59,True) (56,True) (52,True) -0.5678936 (69,True) (61,True) (52,True) -2.7842078 (64,True) (60,True) (50,True) -1.3605657 (65,True) (60,True) (50,True) -1.8624517 (64,True) (57,True) (50,True) -0.9643098 (62,True) (57,True) (50,True) -0.6981955 (62,True) (59,False) (50,True) -1.5811677 (67,True) (62,True) (50,True) -0.7862605 (65,True) (62,True) (50,True) -0.66522974 (66,True) (62,True) (50,True) -0.3519706 (65,True) (59,True) (50,True) -0.47260714 (57,True) (55,False) (50,True) -1.3563819 (64,True) (55,True) (50,True) -1.7396674 (60,True) (55,True) (50,True) -0.44413108 (57,True) (55,True) (50,True) -1.0558256 (59,True) (55,True) (50,True) -0.36487022 (67,True) (55,True) (50,True) -0.35041896 (65,True) (55,True) (50,True) -0.80794466 (67,True) (65,True) (50,True) -1.1467372 (57,True) (53,True) (50,True) -0.25946075 (62,True) (53,True) (50,True) -0.72501534 (55,True) (53,True) (50,True) -1.5453788 (64,True) (52,True) (50,True) -1.0769058 (57,True) (52,True) (50,True) -0.64007187 (64,True) (56,True) (50,True) -0.542033 (59,True) (56,True) (50,True) -1.7796807 (60,True) ||| (79,False) -2.6325612 (57,True) ||| (79,False) -2.5948036 (48,True) ||| (79,False) -1.886565 (52,True) ||| (79,False) -0.41417664 (58,True) ||| (79,False) -1.2616619 (60,False) ||| (79,True) -1.246245 (60,True) ||| (79,True) -2.4414132 (57,True) ||| (79,True) -1.193306 (59,False) ||| (79,True) -1.2143798 (59,True) ||| (79,True) -2.2990801 (48,False) ||| (79,True) -2.1484857 (48,True) ||| (79,True) -2.1811202 (52,True) ||| (79,True) -0.40600443 (58,False) ||| (79,True) -1.8916692 <s> (64,False) (56,False) -0.4178869 (71,False) (64,False) (56,False) -0.68429047 (71,True) (64,False) (56,False) -2.6465292 (69,True) (64,True) (56,False) -1.2499778 (71,False) (64,True) (56,False) -2.8825953 (64,True) (60,True) (56,False) -0.87020755 (71,False) (62,False) (56,False) -0.825454 (64,False) (59,False) (56,False) -0.1686058 ||| (59,False) (56,False) -1.4627118 (64,True) (59,False) (56,False) -0.6499927 (71,False) (59,False) (56,False) -2.0893674 (64,True) (59,True) (56,False) -1.2265545 (74,False) (71,False) (56,False) -1.3366761 (60,True) ||| (74,False) -1.9270219 (57,True) ||| (74,False) -1.2674253 (62,True) ||| (74,False) -1.5752705 (53,True) ||| (74,False) -1.8188037 (48,True) ||| (74,False) -2.2693908 (52,True) ||| (74,False) -0.98216265 (79,False) (67,False) (74,False) -1.1568639 ||| (79,False) (74,False) -2.4197724 ||| (76,True) (74,False) -0.16955785 ||| (83,False) (74,False) -1.7730627 <s> (60,False) (76,False) -1.4896586 ||| (60,False) (76,False) -2.0357223 (60,True) ||| (76,False) -1.5368843 (57,True) ||| (76,False) -1.018639 (59,True) ||| (76,False) -1.9081388 (53,True) ||| (76,False) -2.0125656 (45,True) ||| (76,False) -1.4281552 (47,True) ||| (76,False) -1.7085489 (48,True) ||| (76,False) -1.8266003 (52,True) ||| (76,False) -0.40534204 (54,True) ||| (76,False) -1.1433468 (79,False) (72,False) (76,False) -0.6544893 <s> (79,False) (76,False) -1.0488379 ||| (79,False) (76,False) -1.5753802 ||| (79,True) (76,False) -0.16925044 <s> (84,False) (76,False) -0.5523875 (60,False) ||| (76,True) -0.6978437 (57,False) ||| (76,True) -0.7418139 (60,True) ||| (76,True) -0.725725 (57,True) ||| (76,True) -0.83747184 (59,False) ||| (76,True) -1.0826035 (55,False) ||| (76,True) -1.1845931 (55,True) ||| (76,True) -1.1548202 (45,False) ||| (76,True) -1.3396943 (45,True) ||| (76,True) -1.2132951 (47,False) ||| (76,True) -1.1536156 (48,False) ||| (76,True) -1.2095357 (48,True) ||| (76,True) -1.1202878 (52,False) ||| (76,True) -1.1535472 (52,True) ||| (76,True) -0.5780941 (56,False) ||| (76,True) -0.38596565 (76,False) ||| (76,True) -0.38596565 (76,True) ||| (76,True) -0.5541532 (56,True) ||| (76,True) -0.38596565 (54,False) ||| (76,True) -1.6762816 ||| (60,True) (76,True) -1.3083831 ||| (62,False) (76,True) -1.081534 (79,True) (72,True) (76,True) -0.79677397 ||| (79,True) (76,True) -0.091310464 ||| (84,True) (76,True) -1.789274 (60,True) ||| (77,False) -2.3364918 (57,True) ||| (77,False) -2.0667706 (59,True) ||| (77,False) -2.0738032 (53,True) ||| (77,False) -1.7711316 (57,False) ||| (77,True) -1.8239269 (57,True) ||| (77,True) -0.76894885 (62,False) ||| (77,True) -1.2701635 (62,True) ||| (77,True) -1.8045863 (53,False) ||| (77,True) -1.5781649 (53,True) ||| (77,True) -0.41279438 (71,True) (60,False) (56,True) -0.85836476 (69,False) (64,True) (56,True) -2.484919 ||| (64,True) (56,True) -0.35413557 (71,True) (64,True) (56,True) -1.6476566 (64,True) (62,False) (56,True) -0.95011187 (69,False) (62,True) (56,True) -1.4301255 (64,True) (62,True) (56,True) -0.68353206 (71,True) (62,True) (56,True) -0.17366946 ||| (59,True) (56,True) -0.7870958 (64,True) (59,True) (56,True) -0.67872936 (71,True) (59,True) (56,True) -1.7087913 (64,False) (59,False) (44,False) -0.50989187 (59,False) (52,False) (44,False) -2.0494113 (64,True) (59,True) (44,True) -0.69495857 (62,False) (59,True) (44,True) -0.45951885 (59,True) (52,True) (44,True) -1.6509287 (60,False) (55,False) (40,False) -1.3348093 (59,False) (55,False) (40,False) -1.9181507 (55,False) (52,False) (40,False) -0.39063242 (57,False) (55,True) (40,True) -1.8644211 (60,True) (55,True) (40,True) -1.175308 (59,True) (55,True) (40,True) -0.39063242 (58,False) (55,True) (40,True) -2.2547774 (55,True) (52,True) (40,True) -2.266655 (60,False) (57,False) (41,False) -1.0409626 (60,True) (57,False) (41,False) -1.4286538 (62,True) (57,True) (41,False) -2.4189358 (60,True) (55,True) (41,False) -1.46685 (57,False) (53,False) (41,False) -2.244326 (55,True) (52,True) (41,False) -2.1217957 (60,False) ||| (74,True) -2.2223628 (60,True) ||| (74,True) -2.1003296 (57,True) ||| (74,True) -1.21384 (62,False) ||| (74,True) -0.913805 (59,False) ||| (74,True) -0.7424857 (62,True) ||| (74,True) -0.8751223 (59,True) ||| (74,True) -1.3307208 (55,False) ||| (74,True) -1.4327103 (55,True) ||| (74,True) -1.7315314 (47,False) ||| (74,True) -2.086712 (48,True) ||| (74,True) -1.3780082 (56,False) ||| (74,True) -1.4519297 (56,True) ||| (74,True) -1.0902833 (79,True) (67,True) (74,True) -1.5910844 ||| (79,True) (74,True) -1.812474 (55,False) (48,False) (36,False) -1.7506746 (60,False) (52,False) (36,False) -1.1011398 (55,False) (52,False) (36,False) -1.312192 (36,False) ||| (36,True) -1.1296544 (36,True) ||| (36,True) -2.1146016 (55,True) (48,True) (36,True) -2.0043917 (60,True) (52,True) (36,True) -0.9028139 (55,True) (52,True) (36,True) -2.0973482 (60,False) (55,False) (46,False) -1.1642771 (62,False) (55,True) (46,False) -1.1565825 (60,True) (53,False) (38,False) -1.2109898 (55,True) (53,False) (38,False) -1.5808213 (60,True) (53,True) (38,True) -1.2132304 (55,True) (53,True) (38,True) -2.2896783 ||| (60,True) (58,False) -2.7779758 (64,True) (60,True) (58,False) -1.76801 (65,True) (60,True) (58,False) -1.6464049 ||| (65,True) (58,False) -2.028114 (55,True) ||| (63,False) -0.9615694 (71,False) (66,False) (63,False) -0.41322255 (63,False) (60,False) (54,False) -2.3320777 ||| (60,True) (54,False) -0.70584995 (62,False) (60,True) (54,False) -2.0257137 ||| (57,True) (54,False) -0.41182798 (69,False) (59,True) (54,False) -2.3019037 (45,False) ||| (63,True) -2.6131914 (45,True) ||| (63,True) -0.8770462 (71,True) (66,True) (63,True) -0.41252488 (62,True) (60,True) (54,True) -0.41252488 (63,True) (60,True) (54,True) -2.022209 ||| (57,True) (54,True) -0.7033527 (62,True) (59,False) (54,True) -0.86926925 (69,True) (59,True) (54,True) -0.53756267 ||| (63,True) (54,True) -2.2479959 ||| (69,True) (66,True) -0.3927017 (74,True) (69,True) (66,True) -1.6563464 ||| (71,False) (66,True) -1.3183912 ||| (71,True) (66,True) -0.10716104 (75,True) (71,True) (66,True) -2.0492094 <s> (69,False) (61,False) -1.6972725 (76,False) (69,False) (61,False) -1.9501581 (69,False) (64,False) (61,False) -2.2863252 ||| (69,True) (61,True) -1.5938768 (76,True) (69,True) (61,True) -1.5404655 (69,True) (64,True) (61,True) -2.1794598 (60,True) ||| (81,False) -2.502052 (57,False) ||| (81,True) -1.3717219 (53,False) ||| (81,True) -1.6157045 (53,True) ||| (81,True) -1.2034254 (62,False) (57,False) (43,False) -1.6062815 (64,True) (59,False) (43,False) -1.84999 (62,False) (59,False) (43,False) -1.3735325 (59,False) (55,False) (43,False) -1.3531559 (55,True) (47,True) (43,False) -0.6940986 (60,True) (58,False) (43,False) -1.4286538 (62,True) (57,True) (43,True) -0.67872936 (64,False) (59,True) (43,True) -1.9522685 (64,True) (59,True) (43,True) -1.8025155 (62,True) (59,True) (43,True) -1.6869137 (59,True) (55,True) (43,True) -0.860731 (59,True) (53,False) (43,True) -1.3531559 (55,True) (47,True) (43,True) -2.9319909 (64,True) (60,True) (58,True) -1.6464049 ||| (65,True) (58,True) -2.659524 (60,True) (57,True) (41,True) -1.6222484 (57,True) (53,True) (41,True) -1.0280452 (59,False) (53,True) (41,True) -2.4116566 ||| (72,True) (70,False) -2.4116566 ||| (72,True) (70,True) -1.9957495 (60,True) (55,True) (46,True) -1.649078 (45,True) ||| (.) -1.8623255 (48,True) ||| (.) -2.1365736 (57,True) ||| (75,False) -2.4648745 (57,False) ||| (75,True) -2.6934621 (57,True) ||| (75,True) -1.6285392 (59,False) ||| (75,True) -1.6497988 (59,True) ||| (75,True) -1.687119 (57,True) (48,True) (33,False) -1.6878271 (57,True) (48,True) (33,True) -0.9749044 (56,False) (50,False) (33,True) -1.2513517 (64,False) ||| (84,True) -2.3650951 (60,False) ||| (84,True) -2.205077 (60,True) ||| (84,True) -2.679669 (60,True) ||| (83,False) -2.338391 (67,False) (64,False) (49,False) -2.0310905 (64,False) (57,False) (49,False) -2.305485 (67,True) (64,True) (49,True) -1.9452431 (64,True) (57,True) (49,True) \end\
DNS Zone
3
HPG-AI/bachbot
languagemodel/bach_kenlm.arpa
[ "MIT" ]
This is en__es example 1 Esto es ejemplo en__es 1 1279257697000,en es,tuid-0001 This is en__es example 2 Esto es ejemplo en__es 2 1279257697000,en es-ES,tuid-0002 This is en__es example 3 Esto es ejemplo en__es 3 1279257697000,en es-MX,tuid-0003 This is en__es example 4 Esto es ejemplo en__es 4 1279257697000,en es-CO,tuid-0004 This is en__es example 5 Esto es ejemplo en__es 5 1279257697000,en-US es-CO,tuid-0005 Esto es ejemplo en__es 6 This is en__es example 6 1279257697000,es en,tuid-0006 Esto es ejemplo en__es 7 This is en__es example 7 1279257697000,es-ES en,tuid-0007 Esto es ejemplo en__es 8 This is en__es example 8 1279257697000,es-MX en,tuid-0008 Esto es ejemplo en__es 9 This is en__es example 9 1279257697000,es-CO en,tuid-0009 Esto es ejemplo en__es 10 This is en__es example 10 1279257697000,es-CO en-US,tuid-0010
ColdFusion CFC
0
Centaurioun/modernmt
test/testcases/res/onlinelearning/Memory.en__es.cfc
[ "Apache-2.0" ]
module.exports = "c";
JavaScript
1
1shenxi/webpack
test/statsCases/async-commons-chunk/c.js
[ "MIT" ]
cell(:LexicalBlock) -> = method(other, outsideSelf = self if(cell?(:activatable) && activatable, fnx(arg, cell(:other) call(cell(:outsideSelf) call(arg))), fn(arg, cell(:other) call(cell(:outsideSelf) call(arg))))) cell(:LexicalBlock) ∘ = method(other, outsideSelf = self if(cell?(:activatable) && activatable, fnx(arg, cell(:outsideSelf) call(cell(:other) call(arg))), fn(arg, cell(:outsideSelf) call(cell(:other) call(arg))))) cell(:LexicalBlock) <- = method(other, outsideSelf = self if(cell?(:activatable) && activatable, fnx(arg, cell(:outsideSelf) call(cell(:other) call(arg))), fn(arg, cell(:outsideSelf) call(cell(:other) call(arg))))) cell(:LexicalBlock) & = method(other, outsideSelf = self if(cell?(:activatable) && activatable, fnx(arg, res1 = cell(:outsideSelf) call(arg) res2 = cell(:other) call(arg) res1 && res2), fn(arg, res1 = cell(:outsideSelf) call(arg) res2 = cell(:other) call(arg) res1 && res2))) cell(:LexicalBlock) | = method(other, outsideSelf = self if(cell?(:activatable) && activatable, fnx(arg, res1 = cell(:outsideSelf) call(arg) res2 = cell(:other) call(arg) res1 || res2), fn(arg, res1 = cell(:outsideSelf) call(arg) res2 = cell(:other) call(arg) res1 || res2))) cell(:LexicalBlock) complement = method( outsideSelf = self if(cell?(:activatable) && activatable, fnx(arg, !(cell(:outsideSelf) call(arg))), fn(arg, !(cell(:outsideSelf) call(arg))))) Sequence Iterate = Sequence mimic do( next? = true next = method( v = @currentValue @currentValue = @ cell(:code) call(*v) v ) ) cell(:LexicalBlock) iterate = method( "Returns an infinite sequence that will in turn yield args, self(args), self(self(args)), etc", +args, Sequence Iterate with(currentValue: args, code: self) )
Ioke
3
olabini/ioke
src/builtin/H10_lexicalBlock.ik
[ "ICU", "MIT" ]
package app.services; import com.google.inject.AbstractModule; public class ArticleServiceModule extends AbstractModule { @Override protected void configure() { bind(ArticleService.class).to(ArticleServiceImpl.class) .asEagerSingleton(); } }
Java
4
zeesh49/tutorials
java-lite/src/main/java/app/services/ArticleServiceModule.java
[ "MIT" ]
@sans_bold: 'Helvetica Neue', 'Foo Bar'; #world[zoom>=11][zoom<=22][reflen<=8][type='bicycle'] { [network='ncn'],[network='rcn'] { shield-name: "[ref]"; shield-face-name: @sans_bold; shield-file: url(img/shield-motorway-1.png); [network='ncn'] { [reflen=8] { shield-file: url(img/shield-motorway-8.png); } } [network='rcn'] { [reflen=8] { shield-file: url(img/shield-trunk-8.png); } } } }
CartoCSS
3
nimix/carto
test/rendering-mss/issue_232.mss
[ "Apache-2.0" ]
/* headers anchors */ .offset-anchor { position: relative; display: block; top: calc(-1 * (var(--nav-h) + var(--top-offset)) + 11rem); width: 0; height: 0; } .anchor { position: absolute; display: block; background: url(/icons/link.svg) 0 50% no-repeat; background-size: 1em 1em; width: 1.4em; height: 1em; top: calc(((var(--h3) - 24px) / 2) + 0.6em); left: -1.4em; opacity: 0; transition: opacity 0.2s; border: none !important; /* TODO get rid of linkify */ } h2:hover .anchor, h3:hover .anchor, h4:hover .anchor, h5:hover .anchor, h6:hover .anchor { opacity: 1; } /* visually hidden, but accessible to assistive tech */ .visually-hidden { border: 0; clip: rect(0 0 0 0); height: auto; margin: 0; overflow: hidden; padding: 0; position: absolute; width: 1px; white-space: nowrap; }
CSS
4
Theo-Steiner/svelte
site/static/global.css
[ "MIT" ]
#summary Home page for documentation and resources about the Yamaha DX7 = Overview = The Yamaha DX7 was the first highly successful purely digital synthesizer, and the best selling synthesizer of its day. It is based on FM synthesis, invented by John Chowning at Stanford University in the early 1970's. As with any synthesis technique, it has strengths and weaknesses, but the strengths make it particularly suitable as the basis for a synthesizer on the Android platform. One significant advantage is that a wide range of different sounds can be created and represented in a tiny amount of storage space - a DX7 patch is 128 bytes. In addition, generating the sound requires modest computing resources. = Reverse Engineering = There are a number of software implementations of the DX7 (most notably, FM7, Hexter, and a CSound translator), but all suffer from imperfect emulation of the original. A major goal of the DX7 synthesis module in this project is to match the original as precisely as possible, or, in some cases, to surpass it in sound quality. To do this, we have a test framework which sends MIDI patches and test notes to a physical DX7s, and a sound capture rig (a Roland Quad-Capture) to capture the sound with very high quality and resolution (192ksamples/s, 24 bits). The goal is to understand and document the synthesis techniques used in the actual DX7 almost to the bit level. Fortunately, this is an achievable goal. The actual synthesis is done by a pair of LSI chips (the YM21290 for envelope generation, and the YM21280 for generating the modulated sine waves), all controlled by an 8 bit microprocessor (a 68B03 in the original DX7, probably running at 2MHz, which was a variant of the Motorola 6800). None of this was capable of a huge amount of complexity. Thus, careful measurement can reveal all the secrets of this hardware. This work is in progress, and as it is completed, the results will be reported in subpages. Much of the publicly available research on the DX7 is based on the DX7 to Csound translator work done by Jeff Harrington and Sylvain Marchand. However, there are numerous details which are inaccurate. = Synthesis = The new synthesis engine is designed with a number of goals in mind: * Top-notch sound quality, meeting or exceeding that of the original DX7 * High performance, for good battery life and robust performance even on limited hardware * A portable C++ codebase, optimized for 32-bit fixed point arithmetic The code draws ideas from a number of different sources, including the original DX7, Hexter, and the Sonivox FM synthesizer (which is now part of the Android source, at [https://github.com/android/platform_external_sonivox/tree/master/arm-fm-22k/lib_src external/sonivox/arm-fm-22k]). = Links = * [http://en.wikipedia.org/wiki/Yamaha_DX7 DX7 Wikipedia page] * [http://www.abdn.ac.uk/~mth192/html/dx7.html Dave Benson's DX7 page] * [http://dssi.sourceforge.net/hexter.html Hexter], another free software emulator * [http://www.vorc.org/text/column/hally/ymxxxx.html Yamaha YM chips numerical classification] * [http://www.parnasse.com/dx72csnd.shtml DX7 to Csound Translator]
MediaWiki
3
google-admin/music-synthesizer-for-android
wiki/YamahaDx7.wiki
[ "Apache-2.0" ]
# # Copyright 2015 © Pointwise, Inc. # All rights reserved. # # This sample script is not supported by Pointwise, Inc. # It is provided freely for demonstration purposes only. # SEE THE WARRANTY DISCLAIMER AT THE BOTTOM OF THIS FILE. # # # ============================================================================ # GENERATE AN UNSTRUCTURED VOLUME MESH FOR A GENERIC AIRCRAFT GEOMETRY # ============================================================================ # Written by: Zach Davis, Pointwise, Inc. # # This script demonstrates the viscous meshing process using a generic # transport aircraft geometry created with OpenVSP. The user has control # over the farfield size and boundary layer resolution. The resulting grid # is saved to the current working directory. # # -------------------------------------------------------- # -- INITIALIZATION # -- # -- Load Glyph package, initialize Pointwise, and # -- define the working directory. # -- # -------------------------------------------------------- # Load Glyph and Tcl Data Structure Libraries package require PWI_Glyph # Initialize Pointwise pw::Application reset pw::Application clearModified # Define Working Directory set scriptDir [file dirname [info script]] # -------------------------------------------------------- # -- USER-DEFINED PARAMETERS # -- # -- Define a set of user-controllable settings. # -- # -------------------------------------------------------- set fileName "GenericTransport.pw"; # Aircraft geometry filename set cLen 238.0; # Characteristic length (inches) set ffSize 100.0; # Farfield size (cLen multiplier) set avgDs1 8.0; # Initial surface triangle average edge length set avgDs2 4.0; # Refined surface triangle average edge length set avgDs3 [expr {5.0 * $cLen}]; # Farfield surface triangle average edge length set teDim 4; # Number of points across trailing edges set rtLayers 21; # Root/Tip connector distribution layers set rtGrowthRate 1.1; # Root/Tip connector distribution growth rate set leteLayers 30; # Leading/Trailing edge connector distribution layers set leteGrowthRate 1.1; # Leading/Trailing edge connector distribution layers set domLayers 15; # Layers for 2D T-Rex surface meshing set domGrowthRate 1.2; # Growth rate for 2D T-Rex surface meshing set aspectRatio 10.0; # Aspect ratio for 2D T-Rex surface meshing set initDs 0.0015; # Initial wall spacing for boundary layer extrusion set growthRate 1.2; # Growth rate for boundary layer extrusion set boundaryDecay 0.85; # Volumetric boundary decay set numLayers 100; # Max number of layers to extrude set fullLayers 1; # Full layers (0 for multi-normals, 1 for single normal) set collisionBuffer 2; # Collision buffer for colliding fronts set maxAngle 165.0; # Max included angle for boundary elements set centroidSkew 1.0; # Max centroid skew for boundary layer elements # -------------------------------------------------------- # -- PROCEDURES # -- # -- Define procedures for frequent tasks. # -- # -------------------------------------------------------- # Get Domains from Underlying Quilt proc DomFromQuilt { quilt } { set gridsOnQuilt [$quilt getGridEntities] foreach grid $gridsOnQuilt { if { [$grid isOfType pw::DomainUnstructured] } { lappend doms $grid } } if { ![info exists doms] } { puts "INFO: There are no domains on [$quilt getName]" return } return $doms } # Get All Connectors in a Domain proc ConsFromDom { dom } { set numEdges [$dom getEdgeCount] for { set i 1 } { $i <= $numEdges } { incr i } { set edge [$dom getEdge $i] set numCons [$edge getConnectorCount] for { set j 1 } { $j <= $numCons } {incr j} { lappend cons [$edge getConnector $j] } } return $cons } # Apply a Growth Distribution to Selected Connectors proc RedistCons { rate layers conList } { global avgDs2 aspectRatio set conMode [pw::Application begin Modify $conList] foreach con $conList { $con replaceDistribution 1 [pw::DistributionGrowth create] set dist [$con getDistribution 1] $dist setBeginSpacing [expr {$avgDs2/$aspectRatio}] $dist setBeginMode LayersandRate $dist setBeginRate $rate $dist setBeginLayers $layers $dist setEndSpacing [expr {$avgDs2/$aspectRatio}] $dist setEndMode LayersandRate $dist setEndRate $rate $dist setEndLayers $layers $con setDimensionFromDistribution } $conMode end unset conMode } # Make a Hemisphere of Unstructured Domains proc UnsHemisphere { diameter center spacing } { set dZ [expr {[lindex $center 2] - $diameter}] set cp1 [list [lindex $center 0] [lindex $center 1] $dZ] set dZ [expr {[lindex $center 2] + $diameter}] set cp2 [list [lindex $center 0] [lindex $center 1] $dZ] set dbCurve [pw::Curve create] set circSeg [pw::SegmentCircle create] $circSeg addPoint $cp1 $circSeg addPoint $cp2 $circSeg setCenterPoint $center "0.0 -1.0 0.0" $dbCurve addSegment $circSeg $dbCurve setName "outer-circle" set hemiSphere [pw::Surface create] $hemiSphere revolve -angle 180.0 $dbCurve $cp1 "0.0 0.0 -1.0" $hemiSphere setName "outer-sphere" pw::Connector setCalculateDimensionSpacing $spacing set hemiDoms [pw::DomainUnstructured createOnDatabase [list $hemiSphere]] for { set i 0 } { $i < [llength $hemiDoms] } { incr i } { set dom [lindex $hemiDoms $i] $dom setRenderAttribute LineMode "Boundary" set edge [$dom getEdge 1] for { set j 1 } { $j <= [$edge getConnectorCount] } { incr j } { lappend hemiCons($i) [$edge getConnector $j] } } set symCons [symdiff $hemiCons(0) $hemiCons(1)] return [list $hemiDoms $symCons] } # Computes the Set Containing the Intersection of Set1 & Set2 proc intersect { set1 set2 } { set set3 [list] foreach item $set1 { if { [lsearch -exact $set2 $item] >= 0 } { lappend set3 $item } } return $set3 } # Computes the Set Containing the Difference of Set1 and Set2 proc difference { set1 set2 } { set set3 [list] foreach item $set1 { if { [lsearch -exact $set2 $item] < 0 } { lappend set3 $item } } return $set3 } # Computes the Set Containing the Symmetric Difference of Set1 & Set2 proc symdiff { set1 set2 } { set set3 [list] foreach item $set1 { if { [lsearch -exact $set2 $item] < 0 } { lappend set3 $item } } foreach item $set2 { if { [lsearch -exact $set1 $item] < 0 } { lappend set3 $item } } return $set3 } # Query the System Clock proc timestamp {} { puts [clock format [clock seconds] -format "%a %b %d %Y %l:%M:%S%p %Z"] } # Query the System Clock (ISO 8601 formatting) proc timestamp_iso {} { puts [clock format [clock seconds] -format "%G-%m-%dT%T%Z"] } # Convert Time in Seconds to h:m:s Format proc convSeconds { time } { set h [expr { int(floor($time/3600)) }] set m [expr { int(floor($time/60)) % 60 }] set s [expr { int(floor($time)) % 60 }] return [format "%02d Hours %02d Minutes %02d Seconds" $h $m $s] } # -------------------------------------------------------- # -- MAIN ROUTINE # -- # -- Main meshing procedure: # -- Load Pointwise File # -- Apply User Settings # -- Gather Analysis Model Information # -- Mesh Surfaces # -- Refine Wing and Tail Surface Meshes with 2D T-Rex # -- Refine Fuselage Surface Mesh # -- Create Farfield # -- Create Symmetry Plane # -- Create Farfield Block # -- Examine Blocks # -- CAE Setup # -- Save the Pointwise Project # -------------------------------------------------------- # Start Time set tBegin [clock seconds] timestamp # Load Pointwise Project File Containing Prepared OpenVSP Geometry pw::Application load [file join $scriptDir $fileName] pw::Display update # Apply User Settings pw::Connector setCalculateDimensionMethod Spacing pw::Connector setCalculateDimensionSpacing $avgDs1 pw::DomainUnstructured setDefault BoundaryDecay $boundaryDecay pw::DomainUnstructured setDefault Algorithm AdvancingFront # Gather Analysis Model Information set allDbs [pw::Database getAll] foreach db $allDbs { if { [$db getDescription] == "Model"} { set dbModel $db } } set numQuilts [$dbModel getQuiltCount] for { set i 1 } { $i <= $numQuilts } { incr i } { lappend dbQuilts [$dbModel getQuilt $i] } pw::Display update # Mesh Surfaces if { [$dbModel isBaseForDomainUnstructured] } { puts "Meshing [$dbModel getName] model..." set surfDoms [pw::DomainUnstructured createOnDatabase -joinConnectors 30 \ -reject unusedSurfs $dbModel] if { [llength $unusedSurfs] > 0 } { puts "Unused surfaces exist, please check geometry." puts $unusedSurfs exit -1 } } else { puts "Unable to mesh model." exit -1 } # Survey Surface Mesh and Isolate Domains and Connectors foreach qlt $dbQuilts { set modelDoms([$qlt getName]) [DomFromQuilt $qlt] } set wingLowerCons [ConsFromDom $modelDoms(wing-lower)] set wingUpperCons [ConsFromDom $modelDoms(wing-upper)] set wingTipCons [ConsFromDom $modelDoms(wing-tip)] set wingTECons [ConsFromDom $modelDoms(wing-trailing-edge)] set horizTailLowerCons [ConsFromDom $modelDoms(htail-lower)] set horizTailUpperCons [ConsFromDom $modelDoms(htail-upper)] set horizTailTipCons [ConsFromDom $modelDoms(htail-tip)] set horizTailTECons [ConsFromDom $modelDoms(htail-trailing-edge)] set vertTailCons [ConsFromDom $modelDoms(vtail)] set vertTailTipCons [ConsFromDom $modelDoms(vtail-tip)] set vertTailTECons [ConsFromDom $modelDoms(vtail-trailing-edge)] set fairingCons [ConsFromDom $modelDoms(fairing)] set fuselageCons [ConsFromDom $modelDoms(fuselage)] # Update Display Window to More Clearly Render the Surface Mesh pw::Display setShowDatabase 0 set allDomsCollection [pw::Collection create] $allDomsCollection set [pw::Grid getAll -type pw::Domain] $allDomsCollection do setRenderAttribute FillMode HiddenLine $allDomsCollection delete pw::Display update # Refine Wing and Tail Surface Meshes with 2D T-Rex ## Adjust Domain Solver Attributes/Update Edge Spacing on Wing & Tail Connectors set wingTailDomsCollection [pw::Collection create] $wingTailDomsCollection set [list $modelDoms(wing-lower) \ $modelDoms(wing-upper) \ $modelDoms(htail-lower) \ $modelDoms(htail-upper) \ $modelDoms(vtail)] $wingTailDomsCollection do setUnstructuredSolverAttribute \ EdgeMaximumLength $avgDs1 $wingTailDomsCollection delete set wingTailConsCollection [pw::Collection create] $wingTailConsCollection set [lsort -unique [join [list $wingLowerCons \ $wingUpperCons \ $wingTipCons \ $horizTailLowerCons \ $horizTailUpperCons \ $horizTailTipCons \ $vertTailCons \ $vertTailTipCons \ $fairingCons]]] pw::Connector setCalculateDimensionSpacing $avgDs2 $wingTailConsCollection do calculateDimension $wingTailConsCollection delete ## Isolate Root, Tip, & LE/TE Connectors on Wing/Tail for 2D T-Rex set wingLECon [intersect $wingLowerCons $wingUpperCons] set wingTELowerCon [intersect $wingLowerCons $wingTECons] set wingTEUpperCon [intersect $wingUpperCons $wingTECons] set wingLowerRootCon [intersect $wingLowerCons $fairingCons] set wingUpperRootCon [intersect $wingUpperCons $fairingCons] set wingLowerTipCon [intersect $wingLowerCons $wingTipCons] set wingUpperTipCon [intersect $wingUpperCons $wingTipCons] set wingRootTECon [intersect $wingTECons $fairingCons] set wingTipTECon [intersect $wingTECons $wingTipCons] set horizTailLECon [intersect $horizTailLowerCons \ $horizTailUpperCons] set horizTailTELowerCon [intersect $horizTailLowerCons \ $horizTailTECons] set horizTailTEUpperCon [intersect $horizTailUpperCons \ $horizTailTECons] set horizTailLowerRootCon [intersect $horizTailLowerCons \ $fuselageCons] set horizTailUpperRootCon [intersect $horizTailUpperCons \ $fuselageCons] set horizTailLowerTipCon [intersect $horizTailLowerCons \ $horizTailTipCons] set horizTailUpperTipCon [intersect $horizTailUpperCons \ $horizTailTipCons] set horizTailRootTECon [intersect $horizTailTECons \ $fuselageCons] set horizTailTipTECon [intersect $horizTailTECons \ $horizTailTipCons] set vertTailRootCon [intersect $fuselageCons $vertTailCons] set vertTailLowerTipCon [intersect $vertTailCons \ $vertTailTipCons] set vertTailRootTECon [intersect $vertTailTECons $fuselageCons] set vertTailTipTECon [intersect $vertTailTipCons \ $vertTailTECons] set vertTailTEUpperCon [intersect $vertTailCons $vertTailTECons] foreach con $vertTailCons { if { ![$con equals $vertTailRootCon] && \ ![$con equals $vertTailLowerTipCon] && \ ![$con equals $vertTailTEUpperCon] } { set vertTailLECon $con } } foreach con $vertTailTECons { if { ![$con equals $vertTailTEUpperCon] && \ ![$con equals $vertTailRootTECon] && \ ![$con equals $vertTailTipTECon] } { set vertTailTELowerCon $con } } foreach con $vertTailTipCons { if { ![$con equals $vertTailLowerTipCon] && \ ![$con equals $vertTailTipTECon] } { set vertTailUpperTipCon $con } } pw::Display update ## Modify Connector Distributions at the Wing & Tail Root/Tip set chordCons [list $wingLowerRootCon \ $wingUpperRootCon \ $horizTailLowerRootCon \ $horizTailUpperRootCon \ $vertTailRootCon \ $wingLowerTipCon \ $wingUpperTipCon \ $horizTailLowerTipCon \ $horizTailUpperTipCon \ $vertTailLowerTipCon \ $vertTailUpperTipCon] RedistCons $rtGrowthRate $rtLayers $chordCons ## Initialize Wing & Tail Tip Domains set tipDomsCollection [pw::Collection create] $tipDomsCollection set [list $modelDoms(wing-tip) \ $modelDoms(htail-tip) \ $modelDoms(vtail-tip)] $tipDomsCollection do initialize $tipDomsCollection delete pw::Display update ## Modify Connector Distributions at Wing/Tail Leading & Trailing Edges set spanCons [list $wingLECon \ $wingTELowerCon \ $wingTEUpperCon \ $horizTailLECon \ $horizTailTELowerCon \ $horizTailTEUpperCon \ $vertTailLECon \ $vertTailTELowerCon \ $vertTailTEUpperCon] RedistCons $leteGrowthRate $leteLayers $spanCons ## Modify Connector Dimensions at TE for Wing/Tail set trailingEdgeRootConsCollection [pw::Collection create] $trailingEdgeRootConsCollection set [list $wingRootTECon \ $wingTipTECon \ $horizTailRootTECon \ $horizTailTipTECon \ $vertTailRootTECon \ $vertTailTipTECon] $trailingEdgeRootConsCollection do setDimension $teDim $trailingEdgeRootConsCollection delete ## Re-create Unstructured Domains on Wing/Tail Trailing Edges as Structured set idx [lsearch $surfDoms $modelDoms(wing-trailing-edge)] set surfDoms [lreplace $surfDoms $idx $idx] set idx [lsearch $surfDoms $modelDoms(htail-trailing-edge)] set surfDoms [lreplace $surfDoms $idx $idx] set idx [lsearch $surfDoms $modelDoms(vtail-trailing-edge)] set surfDoms [lreplace $surfDoms $idx $idx] set trailingEdgeDomsCollection [pw::Collection create] $trailingEdgeDomsCollection set [list $modelDoms(wing-trailing-edge) \ $modelDoms(htail-trailing-edge) \ $modelDoms(vtail-trailing-edge)] $trailingEdgeDomsCollection do delete $trailingEdgeDomsCollection delete set trailingEdges [list htail-trailing-edge \ vtail-trailing-edge \ wing-trailing-edge] foreach edge $trailingEdges { switch $edge { htail-trailing-edge { set conSet $horizTailTECons } vtail-trailing-edge { set conSet $vertTailTECons } wing-trailing-edge { set conSet $wingTECons } } set structDom [pw::DomainStructured createFromConnectors $conSet] set unstructDom [$structDom triangulate] $structDom delete set modelDoms($edge) $unstructDom lappend surfDoms $modelDoms($edge) $unstructDom setRenderAttribute FillMode HiddenLine } ## Resolve Wing/Tail Leading & Trailing Edges with Anisotropic Triangles set wingEmpennageDomsCollection [pw::Collection create] $wingEmpennageDomsCollection set [list $modelDoms(wing-lower) \ $modelDoms(wing-upper) \ $modelDoms(htail-lower) \ $modelDoms(htail-upper) \ $modelDoms(vtail)] $wingEmpennageDomsCollection do setUnstructuredSolverAttribute \ TRexMaximumLayers $domLayers $wingEmpennageDomsCollection do setUnstructuredSolverAttribute \ TRexGrowthRate $domGrowthRate set leBC [pw::TRexCondition create] $leBC setName "leading-edge" $leBC setType Wall $leBC setSpacing [expr {$avgDs2/$aspectRatio}] $leBC apply [list \ [list $modelDoms(wing-lower) $wingLECon] \ [list $modelDoms(wing-upper) $wingLECon] \ [list $modelDoms(wing-lower) $wingTELowerCon] \ [list $modelDoms(wing-upper) $wingTEUpperCon] \ [list $modelDoms(htail-lower) $horizTailLECon] \ [list $modelDoms(htail-upper) $horizTailLECon] \ [list $modelDoms(htail-lower) $horizTailTELowerCon] \ [list $modelDoms(htail-upper) $horizTailTEUpperCon] \ [list $modelDoms(vtail) $vertTailLECon] \ [list $modelDoms(vtail) $vertTailTEUpperCon] \ ] $wingEmpennageDomsCollection do initialize $wingEmpennageDomsCollection delete pw::Display update puts "Resolved Curvature at Wing/Empennage Leading & Trailing Edges" # Refine Fuselage Surface Mesh set symCons [difference $fuselageCons $fairingCons] set symCons [difference $symCons $horizTailLowerCons] set symCons [difference $symCons $horizTailUpperCons] set symCons [difference $symCons $horizTailTECons] set symCons [difference $symCons $vertTailCons] set symCons [difference $symCons $vertTailTECons] set vertTailRootNode0 [$vertTailRootCon getXYZ -parameter 0.0] set vertTailRootNode1 [$vertTailRootCon getXYZ -parameter 1.0] set vertTailRootTENode0 [$vertTailRootTECon getXYZ -parameter 0.0] set vertTailRootTENode1 [$vertTailRootTECon getXYZ -parameter 1.0] if { [lindex $vertTailRootNode0 0] < [lindex $vertTailRootNode1 0] } { set vertTailRootBeg [$vertTailRootCon getNode Begin] set vertTailRootEnd [$vertTailRootCon getNode End] } else { set vertTailRootBeg [$vertTailRootCon getNode End] set vertTailRootEnd [$vertTailRootCon getNode Begin] } if { [lindex $vertTailRootTENode0 1] < [lindex $vertTailRootTENode1 1] } { set vertTailRootTEBeg [$vertTailRootTECon getNode Begin] set vertTailRootTEEnd [$vertTailRootTECon getNode End] } else { set vertTailRootTEBeg [$vertTailRootTECon getNode End] set vertTailRootTEEnd [$vertTailRootTECon getNode Beg] } set conMode [pw::Application begin Modify $symCons] foreach con $symCons { $con replaceDistribution 1 [pw::DistributionGrowth create] set dist [$con getDistribution 1] set conBeg [$con getNode Begin] set conEnd [$con getNode End] if { [$conBeg equals $vertTailRootBeg] || \ [$conBeg equals $vertTailRootEnd] || \ [$conBeg equals $vertTailRootTEBeg] || \ [$conBeg equals $vertTailRootTEEnd] } { $dist setBeginSpacing [expr {$avgDs2/$aspectRatio}] } elseif { [$conEnd equals $vertTailRootBeg] || \ [$conEnd equals $vertTailRootEnd] || \ [$conEnd equals $vertTailRootTEBeg] || \ [$conEnd equals $vertTailRootTEEnd] } { $dist setEndSpacing [expr {$avgDs2/$aspectRatio}] } $dist setBeginMode LayersandRate $dist setBeginRate $leteGrowthRate $dist setBeginLayers $leteLayers $dist setEndMode LayersandRate $dist setEndRate $leteGrowthRate $dist setEndLayers $leteLayers $con setDimensionFromDistribution } $conMode end puts "Surface Meshing Complete" pw::Display update # Create Farfield set modelExtent [pw::Grid getExtents] set minExtent [lindex $modelExtent 0] set maxExtent [lindex $modelExtent 1] set center [pwu::Vector3 divide [pwu::Vector3 add $minExtent $maxExtent] 2.0] set center "[pwu::Vector3 x $center] 0.0 [pwu::Vector3 z $center]" set ff [UnsHemisphere [expr {$ffSize*$cLen}] $center $avgDs3] set ffDoms [lindex $ff 0] set ffSymCons [lindex $ff 1] # Create Symmetry Plane ## Isolate Connectors From Analysis Model Symmetry Edge set modelFace [pw::FaceUnstructured createFromDomains $surfDoms] set edge [$modelFace getEdge 1] for { set i 1 } { $i <= [$edge getConnectorCount] } { incr i } { lappend consInSym [$edge getConnector $i] } set symMode [pw::Application begin Create] set symDom [pw::DomainUnstructured create] set extEdge [pw::Edge createFromConnectors $ffSymCons] $symDom addEdge $extEdge set intEdge [pw::Edge createFromConnectors $consInSym] $symDom addEdge $intEdge if { [$symDom getCellCount] == 0 } { $intEdge reverse } $symMode end unset symMode ## Update Display Color for Symmetry Plane $symDom setRenderAttribute ColorMode Entity $symDom setColor "#FFFF00" pw::Display update # Create Farfield Block ## Retrieve Outer Farfield, Symmetry, and Analysis Model Domains set ffBlkDoms [join [list $ffDoms $symDom $surfDoms]] ## Assemble & Initialize Block set ffBlk [pw::BlockUnstructured createFromDomains $ffBlkDoms] $ffBlk setName "aniso-blk" ## Initialize T-Rex Block set trexMode [pw::Application begin UnstructuredSolver $ffBlk] $ffBlk setUnstructuredSolverAttribute TRexMaximumLayers $numLayers $ffBlk setUnstructuredSolverAttribute TRexGrowthRate $growthRate $ffBlk setUnstructuredSolverAttribute TRexFullLayers $fullLayers $ffBlk setUnstructuredSolverAttribute TRexPushAttributes True $ffBlk setUnstructuredSolverAttribute TRexCollisionBuffer $collisionBuffer $ffBlk setUnstructuredSolverAttribute TRexSkewCriteriaMaximumAngle $maxAngle $ffBlk setUnstructuredSolverAttribute TRexSkewCriteriaCentroid $centroidSkew $ffBlk setUnstructuredSolverAttribute BoundaryDecay $boundaryDecay set modelBC [pw::TRexCondition create] $modelBC setName "aircraft" $modelBC setType "Wall" $modelBC setSpacing $initDs foreach dom $surfDoms { $modelBC apply [list [list $ffBlk $dom]] } set symBC [pw::TRexCondition create] $symBC setName "symmetry" $symBC setType "Match" $symBC apply [list [list $ffBlk $symDom]] $trexMode run Initialize $trexMode end pw::Display update puts "Anisotropic tetrahedra created" # Examine Blocks ## Number of Cells puts "[$ffBlk getCellCount] tetrahedra" puts "[$ffBlk getTRexFullLayerCount] full layers" puts "[$ffBlk getTRexTotalLayerCount] total layers" ## Maximum Included Angle set blkExm [pw::Examine create BlockMaximumAngle] $blkExm addEntity $ffBlk $blkExm setRangeLimits 70.0 175.0 $blkExm examine puts "[format "Maximum included angle: %.3f" [$blkExm getMaximum]]" puts "Number of cells above maximum (175.0): [$blkExm getAboveRange]" $blkExm delete ## Aspect Ratio set blkExm [pw::Examine create BlockAspectRatio] $blkExm addEntity $ffBlk $blkExm examine puts "[format "Maximum aspect ratio: %.3f" [$blkExm getMaximum]]" $blkExm delete ## Centroid Skew set blkExm [pw::Examine create BlockSkewCentroid] $blkExm addEntity $ffBlk $blkExm setRangeLimits 0.4 0.9 $blkExm examine puts "[format "Maximum centroid skew angle: %.3f" [$blkExm getMaximum]]" puts "Number of cells above maximum (0.9): [$blkExm getAboveRange]" $blkExm delete pw::Display update # CAE Setup pw::Application setCAESolver "CGNS" # Define boundary conditions set wallBC [pw::BoundaryCondition create] $wallBC setName "aircraft" $wallBC setPhysicalType "Wall" foreach dom $surfDoms {$wallBC apply [list $ffBlk $dom]} set symBC [pw::BoundaryCondition create] $symBC setName "symmetry" $symBC setPhysicalType "Symmetry Plane" $symBC apply [list $ffBlk $symDom] set ffBC [pw::BoundaryCondition create] $ffBC setName "farfield" $ffBC setPhysicalType "Farfield" foreach dom $ffDoms {$ffBC apply [list $ffBlk $dom]} # Define volume condition set fluidVC [pw::VolumeCondition create] $fluidVC setName "fluid" $fluidVC setPhysicalType "Fluid" $fluidVC apply $ffBlk timestamp puts "Run Time: [convSeconds [pwu::Time elapsed $tBegin]]" # Save the Pointwise Project set fileRoot [file rootname $fileName] set fileExport "$fileRoot-Grid.pw" puts "" puts "Writing $fileExport file..." puts "" pw::Application save [file join $scriptDir $fileExport] pw::Display update exit # # DISCLAIMER: # TO THE MAXIMUM EXTENT PERMITTED BY APPLICABLE LAW, POINTWISE DISCLAIMS # ALL WARRANTIES, EITHER EXPRESS OR IMPLIED, INCLUDING, BUT NOT LIMITED # TO, IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR # PURPOSE, WITH REGARD TO THIS SCRIPT. TO THE MAXIMUM EXTENT PERMITTED # BY APPLICABLE LAW, IN NO EVENT SHALL POINTWISE BE LIABLE TO ANY PARTY # FOR ANY SPECIAL, INCIDENTAL, INDIRECT, OR CONSEQUENTIAL DAMAGES # WHATSOEVER (INCLUDING, WITHOUT LIMITATION, DAMAGES FOR LOSS OF # BUSINESS INFORMATION, OR ANY OTHER PECUNIARY LOSS) ARISING OUT OF THE # USE OF OR INABILITY TO USE THIS SCRIPT EVEN IF POINTWISE HAS BEEN # ADVISED OF THE POSSIBILITY OF SUCH DAMAGES AND REGARDLESS OF THE # FAULT OR NEGLIGENCE OF POINTWISE. #
Glyph
5
smola/language-dataset
data/github.com/pointwise/AircraftMesher/744b4e2c0c7d052639803322a8cec6862a0d1369/AircraftMesher.glf
[ "MIT" ]
// This file is part of OpenCV project. // It is subject to the license terms in the LICENSE file found in the top-level directory // of this distribution and at http://opencv.org/license.html. // // Copyright (C) 2017, Intel Corporation, all rights reserved. // Third party copyrights are property of their respective owners. #include "../precomp.hpp" #ifdef HAVE_PROTOBUF #include <fstream> #include "caffe_io.hpp" #endif namespace cv { namespace dnn { CV__DNN_INLINE_NS_BEGIN #ifdef HAVE_PROTOBUF void shrinkCaffeModel(const String& src, const String& dst, const std::vector<String>& layersTypes) { CV_TRACE_FUNCTION(); std::vector<String> types(layersTypes); if (types.empty()) { types.push_back("Convolution"); types.push_back("InnerProduct"); } caffe::NetParameter net; ReadNetParamsFromBinaryFileOrDie(src.c_str(), &net); for (int i = 0; i < net.layer_size(); ++i) { caffe::LayerParameter* lp = net.mutable_layer(i); if (std::find(types.begin(), types.end(), lp->type()) == types.end()) { continue; } for (int j = 0; j < lp->blobs_size(); ++j) { caffe::BlobProto* blob = lp->mutable_blobs(j); CV_Assert(blob->data_size() != 0); // float32 array. Mat floats(1, blob->data_size(), CV_32FC1, (void*)blob->data().data()); Mat halfs(1, blob->data_size(), CV_16SC1); convertFp16(floats, halfs); // Convert to float16. blob->clear_data(); // Clear float32 data. // Set float16 data. blob->set_raw_data(halfs.data, halfs.total() * halfs.elemSize()); blob->set_raw_data_type(caffe::FLOAT16); } } #if GOOGLE_PROTOBUF_VERSION < 3005000 size_t msgSize = saturate_cast<size_t>(net.ByteSize()); #else size_t msgSize = net.ByteSizeLong(); #endif std::vector<uint8_t> output(msgSize); net.SerializeWithCachedSizesToArray(&output[0]); std::ofstream ofs(dst.c_str(), std::ios::binary); ofs.write((const char*)&output[0], msgSize); ofs.close(); } #else void shrinkCaffeModel(const String& src, const String& dst, const std::vector<String>& types) { CV_Error(cv::Error::StsNotImplemented, "libprotobuf required to import data from Caffe models"); } #endif // HAVE_PROTOBUF CV__DNN_INLINE_NS_END }} // namespace
C++
4
thisisgopalmandal/opencv
modules/dnn/src/caffe/caffe_shrinker.cpp
[ "BSD-3-Clause" ]
(* Content-type: application/vnd.wolfram.mathematica *) (*** Wolfram Notebook File ***) (* http://www.wolfram.com/nb *) (* CreatedBy='Mathematica 12.3' *) (*CacheID: 234*) (* Internal cache information: NotebookFileLineBreakTest NotebookFileLineBreakTest NotebookDataPosition[ 158, 7] NotebookDataLength[ 4196, 121] NotebookOptionsPosition[ 3223, 97] NotebookOutlinePosition[ 3625, 113] CellTagsIndexPosition[ 3582, 110] WindowFrame->Normal*) (* Beginning of Notebook Content *) Notebook[{ Cell[BoxData[ RowBox[{ RowBox[{"StalinSort", "[", "list_", "]"}], ":=", RowBox[{"Module", "[", RowBox[{ RowBox[{"{", RowBox[{"max", "=", RowBox[{"list", "[", RowBox[{"[", "1", "]"}], "]"}]}], "}"}], ",", "\[IndentingNewLine]", RowBox[{ RowBox[{"Reap", "[", RowBox[{"Scan", "[", RowBox[{ RowBox[{ RowBox[{"If", "[", RowBox[{ RowBox[{"#", ">=", "max"}], ",", RowBox[{ RowBox[{"Sow", "[", "#", "]"}], ";", " ", RowBox[{"max", "=", "#"}]}]}], "]"}], "&"}], ",", "list"}], "]"}], "]"}], "[", RowBox[{"[", RowBox[{"2", ",", "1"}], "]"}], "]"}]}], "\[IndentingNewLine]", "]"}]}]], "Input", CellChangeTimes->{{3.839663760983871*^9, 3.839663986880889*^9}, 3.839664032008676*^9}, CellLabel->"In[1]:=",ExpressionUUID->"ce679281-e505-4e4c-8067-3613222917d3"], Cell[BoxData[ RowBox[{ RowBox[{"list", "=", RowBox[{"{", RowBox[{"1", ",", "2", ",", "5", ",", "3", ",", "5", ",", "7"}], "}"}]}], ";"}]], "Input", CellChangeTimes->{{3.839604932975541*^9, 3.839604935599502*^9}}, CellLabel->"In[2]:=",ExpressionUUID->"4087137e-7ab3-4631-8c5f-e05567a4e0c0"], Cell[BoxData[ RowBox[{ RowBox[{"list2", "=", RowBox[{"{", RowBox[{"1", ",", "2", ",", "5", ",", "5", ",", "3", ",", "3", ",", "7"}], "}"}]}], ";"}]], "Input", CellChangeTimes->{{3.83966369052789*^9, 3.83966370667029*^9}}, CellLabel->"In[3]:=",ExpressionUUID->"8f994bc6-df54-4603-92f1-e6fddcb1e6d2"], Cell[CellGroupData[{ Cell[BoxData[ RowBox[{"StalinSort", "[", "list", "]"}]], "Input", CellChangeTimes->{{3.8396639087354593`*^9, 3.839663913245947*^9}, 3.839664051196104*^9}, CellLabel->"In[4]:=",ExpressionUUID->"2aecbc10-5a01-43f5-a909-ee16d528a405"], Cell[BoxData[ RowBox[{"{", RowBox[{"1", ",", "2", ",", "5", ",", "5", ",", "7"}], "}"}]], "Output", CellChangeTimes->{{3.8396639137369013`*^9, 3.839663955880864*^9}, 3.83966399019538*^9, 3.839664079989773*^9, 3.839664212185214*^9}, CellLabel->"Out[4]=",ExpressionUUID->"963fbd13-7e16-47fb-abcd-4ebdf946a562"] }, Open ]], Cell[CellGroupData[{ Cell[BoxData[ RowBox[{"StalinSort", "[", "list", "]"}]], "Input", CellChangeTimes->{{3.839663992558392*^9, 3.8396639961398363`*^9}}, CellLabel->"In[5]:=",ExpressionUUID->"e14e6a6d-b5d9-4cb4-942a-801851cecbda"], Cell[BoxData[ RowBox[{"{", RowBox[{"1", ",", "2", ",", "5", ",", "5", ",", "7"}], "}"}]], "Output", CellChangeTimes->{3.8396639965522747`*^9, 3.839664080000445*^9, 3.839664212201708*^9}, CellLabel->"Out[5]=",ExpressionUUID->"b56a1996-4e19-4f64-825f-ae8f703e80cb"] }, Open ]] }, WindowSize->{929.25, 683.25}, WindowMargins->{{Automatic, 333.75}, {87.75, Automatic}}, FrontEndVersion->"12.3 for Linux x86 (64-bit) (July 9, 2021)", StyleDefinitions->"Default.nb", ExpressionUUID->"abdbaa3b-3b9f-41c7-8be7-f36c62df1a1f" ] (* End of Notebook Content *) (* Internal cache information *) (*CellTagsOutline CellTagsIndex->{} *) (*CellTagsIndex CellTagsIndex->{} *) (*NotebookFileOutline Notebook[{ Cell[558, 20, 912, 26, 71, "Input",ExpressionUUID->"ce679281-e505-4e4c-8067-3613222917d3"], Cell[1473, 48, 306, 7, 29, "Input",ExpressionUUID->"4087137e-7ab3-4631-8c5f-e05567a4e0c0"], Cell[1782, 57, 317, 7, 29, "Input",ExpressionUUID->"8f994bc6-df54-4603-92f1-e6fddcb1e6d2"], Cell[CellGroupData[{ Cell[2124, 68, 238, 4, 29, "Input",ExpressionUUID->"2aecbc10-5a01-43f5-a909-ee16d528a405"], Cell[2365, 74, 318, 5, 33, "Output",ExpressionUUID->"963fbd13-7e16-47fb-abcd-4ebdf946a562"] }, Open ]], Cell[CellGroupData[{ Cell[2720, 84, 212, 3, 29, "Input",ExpressionUUID->"e14e6a6d-b5d9-4cb4-942a-801851cecbda"], Cell[2935, 89, 272, 5, 82, "Output",ExpressionUUID->"b56a1996-4e19-4f64-825f-ae8f703e80cb"] }, Open ]] } ] *)
Mathematica
3
astroC86/stalin-sort
wolfram/stalin-sort.nb
[ "MIT" ]
; CLW file contains information for the MFC ClassWizard [General Info] Version=1 ClassCount=1 ResourceCount=1 NewFileInclude1=#include "stdafx.h" Class1=CPortView LastClass=CPortView LastTemplate=CFormView Resource1=IDD_NODEVIEW [DLG:IDD_NODEVIEW] Type=1 Class=CPortView ControlCount=17 Control1=IDC_EDIT1,edit,1350631552 Control2=IDC_CHECK1,button,1342242819 Control3=IDC_CHECK3,button,1342242819 Control4=IDC_CHECK2,button,1342242819 Control5=IDC_EDIT2,edit,1350631552 Control6=IDC_EDIT4,edit,1350631552 Control7=IDC_EDIT5,edit,1350631552 Control8=IDC_COMBO1,combobox,1344339971 Control9=IDC_EDIT3,edit,1484849280 Control10=IDC_BUTTON2,button,1342242816 Control11=IDC_BUTTON3,button,1342242816 Control12=IDC_STATIC,static,1342308352 Control13=IDC_STATIC,static,1342308352 Control14=IDC_STATIC,static,1342308352 Control15=IDC_STATIC,static,1342308352 Control16=IDC_STATIC,static,1342308352 Control17=IDC_STATIC,static,1342308352 [CLS:CPortView] Type=0 HeaderFile=PortView.h ImplementationFile=PortView.cpp BaseClass=CFormView Filter=D LastObject=IDC_CHECK3 VirtualFilter=VWC
Clarion
1
CarysT/medusa
Tools/NodeSpritePort/NodeSpritePort.clw
[ "MIT" ]
# Normally, variables should be file-local, but this file is loaded with {bare: # true}, so it should be readable by bare_tests.js VariableSetByCoffeeBareTestSetup = 5678
CoffeeScript
1
joseconstela/meteor
packages/non-core/coffeescript/tests/bare_test_setup.coffee
[ "Apache-2.0", "BSD-2-Clause", "MIT" ]
@font-face { font-family: "Test"; src: url("./fonts/test.woff2") format("woff2"); } .index { background: url("http://google.com"); }
Less
2
johanberonius/parcel
packages/core/integration-tests/test/integration/less-url/index.less
[ "MIT" ]
// // Copyright (c) XSharp B.V. All Rights Reserved. // Licensed under the Apache License, Version 2.0. // See License.txt in the project root for license information. // BEGIN NAMESPACE XSharpModel STATIC CLASS XEditorSettings STATIC PROPERTY ShowGrid AS LOGIC AUTO := TRUE STATIC PROPERTY GridX AS INT AUTO := 8 STATIC PROPERTY GridY AS INT AUTO := 8 STATIC PROPERTY PasteOffSetX AS LONG AUTO := 8 STATIC PROPERTY PasteOffSetY AS LONG AUTO := 8 STATIC PROPERTY PartialLasso AS LOGIC AUTO := FALSE STATIC PROPERTY DbServerParentClass AS STRING AUTO := "DbServer" STATIC PROPERTY DbServerDefaultRDD AS STRING AUTO := "DBFNTX" STATIC PROPERTY FieldSpecParentClass AS STRING AUTO := "FieldSpec" STATIC PROPERTY MenuParentClass AS STRING AUTO := "Menu" STATIC PROPERTY ToolbarParentClass AS STRING AUTO := "Menu" STATIC PROPERTY Disassembler AS STRING AUTO := "" END CLASS END NAMESPACE
xBase
3
orangesocks/XSharpPublic
VisualStudio/XSharpCodeModelXs/Settings/XEditorSettings.prg
[ "Apache-2.0" ]
//tab_size=4 // Copyright 2021 nickmqb // SPDX-License-Identifier: Apache-2.0 GenerateState struct #RefType { comp Compilation out StringBuilder ins List<byte> labelAddr Map<string, int> toPatch Map<string, List<UnresolvedGoto>> jumpTargets Map<int, JumpTarget> jumpTargetsList List<JumpTarget> lastStackOp StackOpInfo blockFirstAddr int outerBlockFirstAddr int numLocals int maxLocalIndex int } GenerateResult struct { code string ins List<byte> } UnresolvedGoto struct { addr int type GotoType refToken Token } GotoType enum { goto bz bnz call } JumpTarget struct #RefType { addr int name string tableIndex int } StackOpInfo struct { opcode int index int } Generator { generate(comp Compilation) { s := new GenerateState { comp: comp, out: new StringBuilder{}, ins: new List<byte>{}, labelAddr: new Map.create<string, int>(), toPatch: new Map.create<string, List<UnresolvedGoto>>(), jumpTargets: new Map.create<int, JumpTarget>(), jumpTargetsList: new List<JumpTarget>{}, } u := comp.unit for ln, i in u.lines { u.lines[i].insSpan = IntRange(int.maxValue, int.minValue) } locals := LocalsAllocator.allocate(s) unit(s, u) assert(s.toPatch.count == 0) s.out.write("LOCALS $4096 := zx [\n") { i := 0 while i < s.maxLocalIndex { lc := locals[i] if lc.reg != null { initReg(s, lc.reg) i += 1 } else if lc.const != null { initConst(s, lc.const) i += 1 } else { first := i while i < s.maxLocalIndex && locals[i].reg == null && locals[i].const == null { i += 1 } writeZeroes(s, (i - first) * 4) } } if s.maxLocalIndex == 0 { writeZeroes(s, 4) } } s.out.write("]\n\n") Stdout.writeLine(format("Total number of locals: {}", s.numLocals)) s.out.write(format("// {} bytes ({}%)\n\n", s.ins.count, s.ins.count * 100.0 / 5120)) s.out.write(format("CODE ${} := [\n", s.ins.count * 8)) maxInsPerLine := 0 for ln in u.lines { if ln.insSpan.to > ln.insSpan.from { maxInsPerLine = max(maxInsPerLine, ln.insSpan.to - ln.insSpan.from) } } sep := false lastAddr := 0 for ln in u.lines { containsIns := ln.insSpan.to > ln.insSpan.from if containsIns || ln.relevant { if sep { s.out.write("\t\n") sep = false } if containsIns { assert(lastAddr == ln.insSpan.from) writeLine(s, ref s.ins.slice(ln.insSpan.from, ln.insSpan.to), maxInsPerLine, ln.insSpan.from, u.sf.text.slice(ln.span.from, ln.span.to)) lastAddr = ln.insSpan.to } else { writeLine(s, ref s.ins.slice(0, 0), maxInsPerLine, lastAddr, u.sf.text.slice(ln.span.from, ln.span.to)) } } else { sep = lastAddr > 0 } } s.out.write("]\n\n") s.out.write("JUMP_TABLE $4096 := zx [\n") for t, i in s.jumpTargetsList { assert(t.tableIndex == i) initTarget(s, t) } if s.jumpTargetsList.count == 0 { writeZeroes(s, 4) } s.out.write("]\n") return GenerateResult { code: s.out.compactToString(), ins: s.ins } } writeZeroes(s GenerateState, n int) { while n > 0 { s.out.write("\t") s.out.write(string.repeatChar('0', min(n, 64))) s.out.write("\n") n -= 64 } } unit(s GenerateState, unit CodeUnit) { for it in unit.contents { match it { Decl: {} Block: block(s, it) ComboStatement: { assert(it.nodes[0].as(Token).value == "@") label(s, it) } } } } initReg(s GenerateState, decl Decl) { names := string.join(", ", ref decl.allNames.slice(0, decl.allNames.count)) s.out.write(format("\t{} // (0x{}, count = {}, {}", Util.format16le(decl.valueExpr != null ? decl.valueExpr.value : 0), Util.toHex(decl.localIndex), decl.numReads + decl.numWrites, names)) if decl.valueExpr != null && decl.valueExpr.value != 0 { s.out.write(format(", value = {}", decl.valueExpr.value)) } s.out.write(")\n") } initConst(s GenerateState, ci ConstInfo) { s.out.write("\t") s.out.write(format("{} // (0x{}, count = {}, hex_value = 0x{}", Util.format16le(ci.value), Util.toHex(ci.localIndex), ci.numReads, Util.toHex(ci.value))) if ci.pos { s.out.write(format(", value = {}", ci.value)) } if ci.neg { s.out.write(format(", value = {}", ci.value - 0x10000)) } s.out.write(")\n") } initTarget(s GenerateState, target JumpTarget) { s.out.write("\t") s.out.write(format("{} // (0x{}", Util.format16le(target.addr), Util.toHex(target.tableIndex))) if target.name != "" { s.out.write(format(", @{}", target.name)) } s.out.write(")\n") } block(s GenerateState, bl Block) { prevOuter := s.outerBlockFirstAddr s.outerBlockFirstAddr = s.blockFirstAddr s.blockFirstAddr = s.ins.count begin := s.ins.count for it in bl.contents { match it { Token: token(s, it) NumberExpr: numberExpr(s, it) ComboStatement: combo(s, it) Block: block(s, it) } } s.blockFirstAddr = s.outerBlockFirstAddr s.outerBlockFirstAddr = prevOuter } token(s GenerateState, token Token) { addr := s.ins.count assert(token.type == TokenType.identifier || token.type == TokenType.operator) sym := s.comp.symbols.get(token.value) if sym.type == SymbolType.opcode { op(s, sym) } else if sym.type == SymbolType.decl { get(s, sym.node.as(Decl).localIndex) } else if sym.type == SymbolType.reserved { if token.value == "ret" { ret(s) } else { abandon() } } else { abandon() } updateLineInfo(s, token, addr, s.ins.count) } op(s GenerateState, sym SymbolInfo) { // Must have at least one cycle between certain stack instructions if sym.opcode == OpcodeInfo.pop || sym.opcode == OpcodeInfo.ret { if s.lastStackOp.index == s.ins.count - 1 { if s.lastStackOp.opcode == OpcodeInfo.push { s.ins[s.lastStackOp.index] = cast(OpcodeInfo.push_slow, byte) } else if s.lastStackOp.opcode == OpcodeInfo.pop { s.ins[s.lastStackOp.index] = cast(OpcodeInfo.pop_slow, byte) } } } s.lastStackOp = StackOpInfo { opcode: sym.opcode, index: s.ins.count } emit(s, sym.opcode) } ret(s GenerateState) { op(s, s.comp.symbols.get("ret")) } numberExpr(s GenerateState, num NumberExpr) { begin := s.ins.count const(s, num.value) updateLineInfo(s, num.token, begin, s.ins.count) } const(s GenerateState, value int) { value &= 0xffff info := s.comp.constUsages.get(value) get(s, info.localIndex) } combo(s GenerateState, st ComboStatement) { begin := s.ins.count first := st.nodes[0].as(Token) if first.value == "if" { if_(s, st) return } else if first.value == "in" || first.value == "out" { in_out(s, st) } else if first.value == "<<" || first.value == ">>s" || first.value == ">>u" { shift(s, st) } else if first.value == "goto" { goto(s, st) } else if first.value == "call" { call(s, st) } else if first.value == "=>" { put(s, st) } else if first.value == "@" { label(s, st) return } else { abandon() } updateLineInfo(s, first, begin, s.ins.count) } if_(s GenerateState, st ComboStatement) { ifStart := s.ins.count ifKeyword := st.nodes[0].as(Token) flag := st.nodes[1].as(Token) assert(flag.value == "z" || flag.value == "nz") isNz := flag.value == "nz" action := st.nodes[2] if action.is(Block) { emit(s, 0) emit(s, 0) updateLineInfo(s, ifKeyword, ifStart, s.ins.count) block(s, action.as(Block)) type := isNz ? GotoType.bz : GotoType.bnz // Invert condition if st.nodes.count > 3 { elseKeyword := st.nodes[3].as(Token) elseStart := s.ins.count emit(s, 0) emit(s, 0) patch(s, ifStart, s.ins.count, type, "", ifKeyword) updateLineInfo(s, elseKeyword, elseStart, s.ins.count) block(s, st.nodes[4].as(Block)) patch(s, elseStart, s.ins.count, GotoType.goto, "", elseKeyword) } else { patch(s, ifStart, s.ins.count, type, "", ifKeyword) } } else if action.is(Token) { assert(action.as(Token).value == "goto") gotoLabel(s, st.nodes[3].as(Token).value, isNz ? GotoType.bnz : GotoType.bz, ifKeyword) updateLineInfo(s, ifKeyword, ifStart, s.ins.count) } } in_out(s GenerateState, st ComboStatement) { first := st.nodes[0].as(Token) port := st.nodes[2].as(NumberExpr) if first.value == "in" { emit(s, OpcodeInfo.in_) } else if first.value == "out" { emit(s, OpcodeInfo.out) } else { abandon() } emit(s, port.value) } shift(s GenerateState, st ComboStatement) { first := st.nodes[0].as(Token) amount := st.nodes[2].as(NumberExpr) if first.value == "<<" { const(s, 1 << amount.value) emit(s, OpcodeInfo.mul) } else if first.value == ">>s" { const(s, 1 << (12 - amount.value)) emit(s, OpcodeInfo.mul12s) } else if first.value == ">>u" { const(s, 1 << (16 - amount.value)) emit(s, OpcodeInfo.mul16) } else { abandon() } } goto(s GenerateState, st ComboStatement) { keyword := st.nodes[0].as(Token) gotoLabel(s, st.nodes[1].as(Token).value, GotoType.goto, keyword) } call(s GenerateState, st ComboStatement) { keyword := st.nodes[0].as(Token) gotoLabel(s, st.nodes[1].as(Token).value, GotoType.call, keyword) } label(s GenerateState, st ComboStatement) { addr := s.ins.count name := st.nodes[1].as(Token) s.labelAddr.add(name.value, addr) tp := s.toPatch.getOrDefault(name.value) if tp != null { for ug in tp { patch(s, ug.addr, addr, ug.type, name.value, ug.refToken) } s.toPatch.remove(name.value) } updateLineInfo(s, st.nodes[0].as(Token), addr, s.ins.count) } gotoLabel(s GenerateState, target string, type GotoType, refToken Token) { addr := s.ins.count targetAddr := target == "begin" ? Maybe.from(s.blockFirstAddr) : (target == "outer_begin" ? Maybe.from(s.outerBlockFirstAddr) : s.labelAddr.maybeGet(target)) emit(s, 0) emit(s, 0) if targetAddr.hasValue { patch(s, addr, targetAddr.value, type, (target != "begin" && target != "outer_begin") ? target : "", refToken) } else { tp := s.toPatch.getOrDefault(target) if tp == null { tp = new List<UnresolvedGoto>{} s.toPatch.add(target, tp) } tp.add(UnresolvedGoto { addr: addr, type: type, refToken: refToken }) } } patch(s GenerateState, addr int, targetAddr int, type GotoType, targetName string, refToken Token) { rel := targetAddr - (addr + 2) if type == GotoType.goto { if -(0x400) <= rel && rel < 0x400 { rel = rel >= 0 ? rel : (rel + 0x800) assert(0 <= rel && rel < 0x800) s.ins[addr] = checked_cast(OpcodeInfo.goto | (rel >> 8), byte) s.ins[addr + 1] = checked_cast(rel & 0xff, byte) } else { jump(s, addr, targetAddr, OpcodeInfo.jump, targetName) } } else if type == GotoType.bz || type == GotoType.bnz { nzMask := type == GotoType.bnz ? 0x4 : 0 if -(0x200) <= rel && rel < 0x200 { rel = rel >= 0 ? rel : (rel + 0x400) assert(0 <= rel && rel < 0x400) s.ins[addr] = checked_cast(OpcodeInfo.bzbnz | nzMask | (rel >> 8), byte) s.ins[addr + 1] = checked_cast(rel & 0xff, byte) } else { errorAtRange(s.comp, refToken.span, "Conditional goto target address is too far away") } } else if type == GotoType.call { jump(s, addr, targetAddr, OpcodeInfo.call, targetName) } else { abandon() } } jump(s GenerateState, addr int, targetAddr int, opcode int, targetName string) { target := s.jumpTargets.getOrDefault(targetAddr) if target == null { if s.jumpTargetsList.count >= 192 { error(s.comp, format("Too many jump targets ({})", s.jumpTargetsList.count)) } target = new JumpTarget { addr: targetAddr, name: targetName, tableIndex: s.jumpTargetsList.count } s.jumpTargets.add(targetAddr, target) s.jumpTargetsList.add(target) } s.ins[addr] = checked_cast(opcode, byte) s.ins[addr + 1] = checked_cast(target.tableIndex & 0xff, byte) } get(s GenerateState, localIndex int) { if localIndex < 128 { emit(s, localIndex) } else { emit(s, OpcodeInfo.get_ex) emit(s, localIndex) } } put(s GenerateState, st ComboStatement) { id := st.nodes[1].as(Token) sym := s.comp.symbols.get(id.value) assert(sym.type == SymbolType.decl) decl := sym.node.as(Decl) localIndex := decl.localIndex if localIndex < 64 { emit(s, 0x80 | localIndex) } else { emit(s, OpcodeInfo.put_ex) emit(s, localIndex) } } emit(s GenerateState, val int) { s.ins.add(checked_cast(val, byte)) } updateLineInfo(s GenerateState, token Token, fromAddr int, toAddr int) { sp := ref s.comp.unit.lines[token.line].insSpan sp.from = min(sp.from, fromAddr) sp.to = max(sp.to, toAddr) } writeLine(s GenerateState, bytes Array<byte>, padBytes int, addr int, lineText string) { s.out.write("\t") for b in bytes { Util.writeByteHexTo(b, s.out) } for i := bytes.count; i < padBytes { s.out.write(" ") } s.out.write(" // ") s.out.write(Util.format16(addr)) s.out.write(" ") s.out.write(lineText.replace("\t", " ")) s.out.write("\n") } errorAtRange(comp Compilation, span IntRange, text string) { Stderr.writeLine(ErrorHelper.getErrorDesc(comp.unit.sf.path, comp.unit.sf.text, span, text)) exit(1) } error(comp Compilation, text string) { Stderr.writeLine(text) exit(1) } } Local struct { reg Decl const ConstInfo numUsages int } LocalsAllocator { localByNumUsagesDesc(a Local, b Local) { return int.compare(b.numUsages, a.numUsages) } allocate(s GenerateState) { comp := s.comp locals := new List<Local>{} for e in comp.symbols { sym := e.value if sym.type == SymbolType.decl { decl := sym.node.as(Decl) if decl.isVar { numUsages := decl.numReads + decl.numWrites if numUsages > 0 { locals.add(Local { reg: decl, numUsages: numUsages }) } } } } for e in comp.constUsages { locals.add(Local { const: e.value, numUsages: e.value.numReads }) } if locals.count >= 256 { Generator.error(comp, format("Too many locals ({})", locals.count)) } locals.stableSort(localByNumUsagesDesc) s.numLocals = locals.count slots := new Array<Local>(256) a := 0 b := 64 c := 128 for lc in locals { slot := 0 if lc.reg != null && a < 64 { slot = a a += 1 } else if b < 128 { slot = b b += 1 } else { slot = c c += 1 } if lc.reg != null { lc.reg.localIndex = slot } else { lc.const.localIndex = slot } slots[slot] = lc } s.maxLocalIndex = c > 128 ? c : (b > 64 ? b : a) for e in comp.symbols { sym := e.value if sym.type == SymbolType.decl { decl := sym.node.as(Decl) if !decl.isVar { val := decl.valueExpr.value & 0xffff info := comp.constUsages.getOrDefault(val) if info != null { decl.localIndex = info.localIndex } } } } return slots } }
mupad
5
nickmqb/fpga_craft
kasm/generator.mu
[ "Apache-2.0" ]
"""Test reproduce state for Light.""" import pytest from homeassistant.components import light from homeassistant.components.light.reproduce_state import DEPRECATION_WARNING from homeassistant.core import State from homeassistant.helpers.state import async_reproduce_state from tests.common import async_mock_service VALID_BRIGHTNESS = {"brightness": 180} VALID_WHITE_VALUE = {"white_value": 200} VALID_FLASH = {"flash": "short"} VALID_EFFECT = {"effect": "random"} VALID_TRANSITION = {"transition": 15} VALID_COLOR_NAME = {"color_name": "red"} VALID_COLOR_TEMP = {"color_temp": 240} VALID_HS_COLOR = {"hs_color": (345, 75)} VALID_KELVIN = {"kelvin": 4000} VALID_PROFILE = {"profile": "relax"} VALID_RGB_COLOR = {"rgb_color": (255, 63, 111)} VALID_RGBW_COLOR = {"rgbw_color": (255, 63, 111, 10)} VALID_RGBWW_COLOR = {"rgbww_color": (255, 63, 111, 10, 20)} VALID_XY_COLOR = {"xy_color": (0.59, 0.274)} async def test_reproducing_states(hass, caplog): """Test reproducing Light states.""" hass.states.async_set("light.entity_off", "off", {}) hass.states.async_set("light.entity_bright", "on", VALID_BRIGHTNESS) hass.states.async_set("light.entity_white", "on", VALID_WHITE_VALUE) hass.states.async_set("light.entity_flash", "on", VALID_FLASH) hass.states.async_set("light.entity_effect", "on", VALID_EFFECT) hass.states.async_set("light.entity_trans", "on", VALID_TRANSITION) hass.states.async_set("light.entity_name", "on", VALID_COLOR_NAME) hass.states.async_set("light.entity_temp", "on", VALID_COLOR_TEMP) hass.states.async_set("light.entity_hs", "on", VALID_HS_COLOR) hass.states.async_set("light.entity_kelvin", "on", VALID_KELVIN) hass.states.async_set("light.entity_profile", "on", VALID_PROFILE) hass.states.async_set("light.entity_rgb", "on", VALID_RGB_COLOR) hass.states.async_set("light.entity_xy", "on", VALID_XY_COLOR) turn_on_calls = async_mock_service(hass, "light", "turn_on") turn_off_calls = async_mock_service(hass, "light", "turn_off") # These calls should do nothing as entities already in desired state await async_reproduce_state( hass, [ State("light.entity_off", "off"), State("light.entity_bright", "on", VALID_BRIGHTNESS), State("light.entity_white", "on", VALID_WHITE_VALUE), State("light.entity_flash", "on", VALID_FLASH), State("light.entity_effect", "on", VALID_EFFECT), State("light.entity_trans", "on", VALID_TRANSITION), State("light.entity_name", "on", VALID_COLOR_NAME), State("light.entity_temp", "on", VALID_COLOR_TEMP), State("light.entity_hs", "on", VALID_HS_COLOR), State("light.entity_kelvin", "on", VALID_KELVIN), State("light.entity_profile", "on", VALID_PROFILE), State("light.entity_rgb", "on", VALID_RGB_COLOR), State("light.entity_xy", "on", VALID_XY_COLOR), ], ) assert len(turn_on_calls) == 0 assert len(turn_off_calls) == 0 # Test invalid state is handled await async_reproduce_state(hass, [State("light.entity_off", "not_supported")]) assert "not_supported" in caplog.text assert len(turn_on_calls) == 0 assert len(turn_off_calls) == 0 # Make sure correct services are called await async_reproduce_state( hass, [ State("light.entity_xy", "off"), State("light.entity_off", "on", VALID_BRIGHTNESS), State("light.entity_bright", "on", VALID_WHITE_VALUE), State("light.entity_white", "on", VALID_FLASH), State("light.entity_flash", "on", VALID_EFFECT), State("light.entity_effect", "on", VALID_TRANSITION), State("light.entity_trans", "on", VALID_COLOR_NAME), State("light.entity_name", "on", VALID_COLOR_TEMP), State("light.entity_temp", "on", VALID_HS_COLOR), State("light.entity_hs", "on", VALID_KELVIN), State("light.entity_kelvin", "on", VALID_PROFILE), State("light.entity_profile", "on", VALID_RGB_COLOR), State("light.entity_rgb", "on", VALID_XY_COLOR), ], ) assert len(turn_on_calls) == 12 expected_calls = [] expected_off = dict(VALID_BRIGHTNESS) expected_off["entity_id"] = "light.entity_off" expected_calls.append(expected_off) expected_bright = dict(VALID_WHITE_VALUE) expected_bright["entity_id"] = "light.entity_bright" expected_calls.append(expected_bright) expected_white = dict(VALID_FLASH) expected_white["entity_id"] = "light.entity_white" expected_calls.append(expected_white) expected_flash = dict(VALID_EFFECT) expected_flash["entity_id"] = "light.entity_flash" expected_calls.append(expected_flash) expected_effect = dict(VALID_TRANSITION) expected_effect["entity_id"] = "light.entity_effect" expected_calls.append(expected_effect) expected_trans = dict(VALID_COLOR_NAME) expected_trans["entity_id"] = "light.entity_trans" expected_calls.append(expected_trans) expected_name = dict(VALID_COLOR_TEMP) expected_name["entity_id"] = "light.entity_name" expected_calls.append(expected_name) expected_temp = dict(VALID_HS_COLOR) expected_temp["entity_id"] = "light.entity_temp" expected_calls.append(expected_temp) expected_hs = dict(VALID_KELVIN) expected_hs["entity_id"] = "light.entity_hs" expected_calls.append(expected_hs) expected_kelvin = dict(VALID_PROFILE) expected_kelvin["entity_id"] = "light.entity_kelvin" expected_calls.append(expected_kelvin) expected_profile = dict(VALID_RGB_COLOR) expected_profile["entity_id"] = "light.entity_profile" expected_calls.append(expected_profile) expected_rgb = dict(VALID_XY_COLOR) expected_rgb["entity_id"] = "light.entity_rgb" expected_calls.append(expected_rgb) for call in turn_on_calls: assert call.domain == "light" found = False for expected in expected_calls: if call.data["entity_id"] == expected["entity_id"]: # We found the matching entry assert call.data == expected found = True break # No entry found assert found assert len(turn_off_calls) == 1 assert turn_off_calls[0].domain == "light" assert turn_off_calls[0].data == {"entity_id": "light.entity_xy"} @pytest.mark.parametrize( "color_mode", ( light.ColorMode.COLOR_TEMP, light.ColorMode.BRIGHTNESS, light.ColorMode.HS, light.ColorMode.ONOFF, light.ColorMode.RGB, light.ColorMode.RGBW, light.ColorMode.RGBWW, light.ColorMode.UNKNOWN, light.ColorMode.WHITE, light.ColorMode.XY, ), ) async def test_filter_color_modes(hass, caplog, color_mode): """Test filtering of parameters according to color mode.""" hass.states.async_set("light.entity", "off", {}) all_colors = { **VALID_WHITE_VALUE, **VALID_COLOR_NAME, **VALID_COLOR_TEMP, **VALID_HS_COLOR, **VALID_KELVIN, **VALID_RGB_COLOR, **VALID_RGBW_COLOR, **VALID_RGBWW_COLOR, **VALID_XY_COLOR, **VALID_BRIGHTNESS, } turn_on_calls = async_mock_service(hass, "light", "turn_on") await async_reproduce_state( hass, [State("light.entity", "on", {**all_colors, "color_mode": color_mode})] ) expected_map = { light.ColorMode.COLOR_TEMP: {**VALID_BRIGHTNESS, **VALID_COLOR_TEMP}, light.ColorMode.BRIGHTNESS: VALID_BRIGHTNESS, light.ColorMode.HS: {**VALID_BRIGHTNESS, **VALID_HS_COLOR}, light.ColorMode.ONOFF: {**VALID_BRIGHTNESS}, light.ColorMode.RGB: {**VALID_BRIGHTNESS, **VALID_RGB_COLOR}, light.ColorMode.RGBW: {**VALID_BRIGHTNESS, **VALID_RGBW_COLOR}, light.ColorMode.RGBWW: {**VALID_BRIGHTNESS, **VALID_RGBWW_COLOR}, light.ColorMode.UNKNOWN: { **VALID_BRIGHTNESS, **VALID_HS_COLOR, **VALID_WHITE_VALUE, }, light.ColorMode.WHITE: { **VALID_BRIGHTNESS, light.ATTR_WHITE: VALID_BRIGHTNESS[light.ATTR_BRIGHTNESS], }, light.ColorMode.XY: {**VALID_BRIGHTNESS, **VALID_XY_COLOR}, } expected = expected_map[color_mode] assert len(turn_on_calls) == 1 assert turn_on_calls[0].domain == "light" assert dict(turn_on_calls[0].data) == {"entity_id": "light.entity", **expected} # This should do nothing, the light is already in the desired state hass.states.async_set("light.entity", "on", {"color_mode": color_mode, **expected}) await async_reproduce_state( hass, [State("light.entity", "on", {**expected, "color_mode": color_mode})] ) assert len(turn_on_calls) == 1 async def test_deprecation_warning(hass, caplog): """Test deprecation warning.""" hass.states.async_set("light.entity_off", "off", {}) turn_on_calls = async_mock_service(hass, "light", "turn_on") await async_reproduce_state( hass, [State("light.entity_off", "on", {"brightness_pct": 80})] ) assert len(turn_on_calls) == 1 assert DEPRECATION_WARNING % ["brightness_pct"] in caplog.text
Python
5
mtarjoianu/core
tests/components/light/test_reproduce_state.py
[ "Apache-2.0" ]
package com.baeldung.concurrent.runnable; import java.util.concurrent.Callable; import java.util.concurrent.ExecutorService; import java.util.concurrent.Executors; import java.util.concurrent.Future; import org.apache.commons.lang3.RandomUtils; import org.junit.AfterClass; import org.junit.BeforeClass; import org.junit.Test; import org.slf4j.Logger; import org.slf4j.LoggerFactory; public class RunnableVsThreadLiveTest { private static Logger log = LoggerFactory.getLogger(RunnableVsThreadLiveTest.class); private static ExecutorService executorService; @BeforeClass public static void setup() { executorService = Executors.newCachedThreadPool(); } @Test public void givenARunnable_whenRunIt_thenResult() throws Exception{ Thread thread = new Thread(new SimpleRunnable( "SimpleRunnable executed using Thread")); thread.start(); thread.join(); } @Test public void givenARunnable_whenSubmitToES_thenResult() throws Exception{ executorService.submit(new SimpleRunnable( "SimpleRunnable executed using ExecutorService")).get(); } @Test public void givenARunnableLambda_whenSubmitToES_thenResult() throws Exception{ executorService.submit(()-> log.info("Lambda runnable executed!!!")).get(); } @Test public void givenAThread_whenRunIt_thenResult() throws Exception{ Thread thread = new SimpleThread( "SimpleThread executed using Thread"); thread.start(); thread.join(); } @Test public void givenAThread_whenSubmitToES_thenResult() throws Exception{ executorService.submit(new SimpleThread( "SimpleThread executed using ExecutorService")).get(); } @Test public void givenACallable_whenSubmitToES_thenResult() throws Exception { Future<Integer> future = executorService.submit( new SimpleCallable()); log.info("Result from callable: {}", future.get()); } @Test public void givenACallableAsLambda_whenSubmitToES_thenResult() throws Exception { Future<Integer> future = executorService.submit(() -> RandomUtils.nextInt(0, 100)); log.info("Result from callable: {}", future.get()); } @AfterClass public static void tearDown() { if ( executorService != null && !executorService.isShutdown()) { executorService.shutdown(); } } } class SimpleThread extends Thread{ private static final Logger log = LoggerFactory.getLogger(SimpleThread.class); private String message; SimpleThread(String message) { this.message = message; } @Override public void run() { log.info(message); } } class SimpleRunnable implements Runnable { private static final Logger log = LoggerFactory.getLogger(SimpleRunnable.class); private String message; SimpleRunnable(String message) { this.message = message; } @Override public void run() { log.info(message); } } class SimpleCallable implements Callable<Integer> { @Override public Integer call() throws Exception { return RandomUtils.nextInt(0, 100); } }
Java
5
zeesh49/tutorials
core-java-concurrency/src/test/java/com/baeldung/concurrent/runnable/RunnableVsThreadLiveTest.java
[ "MIT" ]
// This source file is part of the Swift.org open source project // Copyright (c) 2014 - 2017 Apple Inc. and the Swift project authors // Licensed under Apache License v2.0 with Runtime Library Exception // // See https://swift.org/LICENSE.txt for license information // See https://swift.org/CONTRIBUTORS.txt for the list of Swift project authors // RUN: not %target-swift-frontend %s -typecheck protocol A { func d typealias B : B) { class c() as String) -> Any] as String) -> <S : d where g.init(range.Type }))!) } } func d<T) -> { public subscript () { } class func b> { func d<1 { } return { var b { typealias e : A, let h, f: ({ } typealias f == b) -> U -> { } class a { let a { let h
Swift
1
lwhsu/swift
validation-test/compiler_crashers_fixed/02005-swift-parser-parsedeclvargetset.swift
[ "Apache-2.0" ]
Rebol [ Title: "Test Ping Pong Server" File: %test-pingpong-server.r3 Note: { Based on original Port examples which can be found at: https://web.archive.org/web/20131012055435/http://www.rebol.net:80/wiki/Port_Examples } ] print "Ping pong server" server: open tcp://:8080 server/awake: func [event /local port] [ if event/type = 'accept [ port: first event/port port/awake: func [event] [ ;probe event/type switch event/type [ read [ print ["Client said:" to-string event/port/data] clear event/port/data write event/port to-binary "pong!" ] wrote [ print "Server sent pong to client" read event/port ] close [ close event/port return true ] ] false ] read port ] false ] wait [server 30] close server
Rebol
4
semarie/rebol3-oldes
src/tests/test-pingpong-server.r3
[ "Apache-2.0" ]
module TopModule( input logic clk, input logic rst, output logic [21:0] outOther, input logic [1:0] sig, input logic flip, output logic [1:0] sig_out, output logic [15:0] passThrough); MyInterface #(.WIDTH(4)) MyInterfaceInstance(); SubModule1 u_SubModule1 ( .clk(clk), .rst(rst), .u_MyInterface(MyInterfaceInstance), .outOther(outOther), .sig (sig) ); assign sig_out = MyInterfaceInstance.mysig_out; assign MyInterfaceInstance.setting = flip; assign passThrough = MyInterfaceInstance.passThrough; endmodule interface MyInterface #( parameter WIDTH = 3)( ); logic setting; logic [WIDTH-1:0] other_setting; logic [1:0] mysig_out; logic [15:0] passThrough; modport submodule1 ( input setting, output other_setting, output mysig_out, output passThrough ); modport submodule2 ( input setting, output other_setting, input mysig_out, output passThrough ); endinterface module SubModule1( input logic clk, input logic rst, MyInterface.submodule1 u_MyInterface, input logic [1:0] sig, output logic [21:0] outOther ); always_ff @(posedge clk or posedge rst) if(rst) u_MyInterface.mysig_out <= 0; else begin if(u_MyInterface.setting) u_MyInterface.mysig_out <= sig; else u_MyInterface.mysig_out <= ~sig; end MyInterface #(.WIDTH(22)) MyInterfaceInstanceInSub(); SubModule2 u_SubModule2 ( .clk(clk), .rst(rst), .u_MyInterfaceInSub2(u_MyInterface), .u_MyInterfaceInSub3(MyInterfaceInstanceInSub) ); assign outOther = MyInterfaceInstanceInSub.other_setting; assign MyInterfaceInstanceInSub.setting = 0; assign MyInterfaceInstanceInSub.mysig_out = sig; endmodule module SubModule2( input logic clk, input logic rst, MyInterface.submodule2 u_MyInterfaceInSub2, MyInterface.submodule2 u_MyInterfaceInSub3 ); always_comb begin if (u_MyInterfaceInSub3.mysig_out == 2'b00) u_MyInterfaceInSub3.other_setting[21:0] = 1000; else if (u_MyInterfaceInSub3.mysig_out == 2'b01) u_MyInterfaceInSub3.other_setting[21:0] = 2000; else if (u_MyInterfaceInSub3.mysig_out == 2'b10) u_MyInterfaceInSub3.other_setting[21:0] = 3000; else u_MyInterfaceInSub3.other_setting[21:0] = 4000; end assign u_MyInterfaceInSub2.passThrough[7:0] = 124; assign u_MyInterfaceInSub2.passThrough[15:8] = 200; endmodule
SystemVerilog
4
kallisti5/yosys
tests/svinterfaces/svinterface1.sv
[ "ISC" ]
#N canvas 872 46 759 894 12; #X obj 100 150 inlet~; #X obj 436 211 loadbang; #X obj 159 590 * -1; #X obj 99 615 +~; #X obj 181 717 +~; #X obj 181 816 outlet~; #X obj 509 296 pow; #X obj 456 320 *; #X floatatom 456 361 0 0 0 0 - - - 0; #X obj 100 524 *~ 0; #X obj 270 387 pow; #X text 486 360 delay \, msec; #X floatatom 270 460 0 0 0 0 - - - 0; #X obj 288 360 * 0.001; #X text 304 426 gain for this stage, f 10; #X obj 117 590 *~ 0; #X obj 99 656 *~ 0; #X obj 270 430 *; #X obj 436 239 t b b b b; #X obj 456 416 abs; #X obj 456 442 moses 0.01; #X obj 523 469 print wrong-delay-time; #X obj 400 150 inlet~; #X obj 382 771 +~; #X obj 382 816 outlet~; #X text 236 231 decay after; #X text 247 246 1 second; #X obj 245 267 r \$1-decay; #X obj 312 518 r \$1-clear; #X obj 312 542 t b; #X obj 312 616 delay; #X obj 312 592 + 5; #X obj 199 520 delread~ \$2 \$4; #X obj 227 665 delwrite~ \$2 \$4; #X obj 312 568 f \$4; #X obj 456 389 - \$4; #X obj 549 267 float \$3; #X obj 199 545 *~ 1; #X obj 350 371 sqrt; #X text 129 37 Allpass filter for mono reverberator \; Arg 1 = delay name \; Arg2 = stage number \; Arg 3 = delay time; #X obj 142 410 f 0.7; #X obj 270 305 f 0; #X obj 456 268 f 8; #X obj 492 267 f 1.79; #X obj 269 593 f 1; #X obj 269 563 f 0; #X connect 0 0 9 0; #X connect 1 0 18 0; #X connect 2 0 16 1; #X connect 3 0 16 0; #X connect 3 0 33 0; #X connect 4 0 5 0; #X connect 4 0 23 0; #X connect 6 0 7 1; #X connect 7 0 8 0; #X connect 7 0 13 0; #X connect 8 0 35 0; #X connect 9 0 3 0; #X connect 10 0 17 0; #X connect 13 0 10 1; #X connect 15 0 3 1; #X connect 16 0 4 0; #X connect 17 0 12 0; #X connect 17 0 9 1; #X connect 18 0 40 0; #X connect 18 0 41 0; #X connect 18 1 42 0; #X connect 18 2 43 0; #X connect 18 3 36 0; #X connect 19 0 20 0; #X connect 20 1 21 0; #X connect 22 0 23 1; #X connect 23 0 24 0; #X connect 27 0 10 0; #X connect 28 0 29 0; #X connect 29 0 34 0; #X connect 29 0 45 0; #X connect 30 0 44 0; #X connect 31 0 30 0; #X connect 32 0 37 0; #X connect 34 0 31 0; #X connect 35 0 19 0; #X connect 36 0 6 1; #X connect 37 0 15 0; #X connect 37 0 4 1; #X connect 38 0 17 1; #X connect 40 0 2 0; #X connect 40 0 15 1; #X connect 41 0 10 0; #X connect 42 0 7 0; #X connect 43 0 6 0; #X connect 43 0 38 0; #X connect 44 0 37 1; #X connect 45 0 37 1;
Pure Data
4
myQwil/pure-data
extra/rev1-stage.pd
[ "TCL" ]
// edition:2018 // // Tests that the .await syntax can't be used to make a generator async fn foo() {} fn make_generator() { let _gen = || foo().await; //~^ ERROR `await` is only allowed inside `async` functions and blocks } fn main() {}
Rust
4
Eric-Arellano/rust
src/test/ui/async-await/issues/issue-51719.rs
[ "ECL-2.0", "Apache-2.0", "MIT-0", "MIT" ]
from .converters import * # noqa: F403
Python
0
Hacky-DH/pytorch
torch/fx/experimental/fx2trt/__init__.py
[ "Intel" ]
<?xml version="1.0" encoding="iso-8859-1"?> <!-- $Id: streamsinclude.xsl,v 1.1 2003-10-27 15:12:20 chregu Exp $ --> <xsl:stylesheet version="1.0" xmlns:xsl="http://www.w3.org/1999/XSL/Transform" > <xsl:output method="xml" encoding="iso-8859-1" indent="no"/> <xsl:include href="compress.zlib://xslt.xsl.gz"/> </xsl:stylesheet>
XSLT
3
donsbot/hhvm
hphp/test/zend/good/ext/xsl/tests/streamsinclude.xsl
[ "PHP-3.01", "Zend-2.0" ]
<% provide :title, "Deliver new inbound email by source" %> <h1>Deliver new inbound email by source</h1> <%= form_with(url: main_app.rails_conductor_inbound_email_sources_path, local: true) do |form| %> <div> <%= form.label :source, "Source" %><br> <%= form.text_area :source, size: "80x60" %> </div> <%= form.submit "Deliver inbound email" %> <% end %>
HTML+ERB
4
Jiwoong/rails
actionmailbox/app/views/rails/conductor/action_mailbox/inbound_emails/sources/new.html.erb
[ "MIT" ]
# # Copyright 2014 (c) Pointwise, Inc. # All rights reserved. # # This sample Pointwise script is not supported by Pointwise, Inc. # It is provided freely for demonstration purposes only. # SEE THE WARRANTY DISCLAIMER AT THE BOTTOM OF THIS FILE. # ############################################################################# ## ## SemiCircle.glf ## ## CREATE STRUCTURED TOPOLOGY FROM TWO SELECTED CONNECTORS ## ## This script automates the creation of six structured domains from two ## user-specified connectors. In addition to creating the new topology when ## possible (edge dimensions must both be odd), the elliptic solver is run ## for 10 iterations, allowing the newly generated domains to relax to an ## optimal configuration. Note that an initial dimension can be even and used, ## but the dimension will be changed when input(AutoDim) is set to 1 before ## proceeding. ## ## For maximum productivity, a GUI is included, but can easily be disabled. ## Set input(GUI) to 1 on line 39 to enable control over internal dimension. ## Otherwise, simply select three connectors and run the script. The internal ## dimension will be automatically set to an optimal value. ## ############################################################################# package require PWI_Glyph 2.3 ## Set global parameters ## Default solve resulting grids or not set input(Solve) 1 ## Automatically increment even-dimensioned connectors set input(AutoDim) 1 ## Enable (1)/Disable (0) GUI set input(GUI) 0 ## Switch that interpolates gridline angles on outer edges, should remain ## set to 1 for most applications. set interpAngles 1 ## Check that connectors form singly-connected loop proc isLoop { conList } { set e [pw::Edge createFromConnectors -single $conList] if { [llength $e] != 1 } { foreach edge $e { $edge delete } return 0 } set chkVal [$e isClosed] $e delete return $chkVal } ## Return connectors adjacent to specified node that are also in the list $cons proc getAdjCons { node cons } { set list1 [$node getConnectors] set list2 $cons set relCons [list] foreach ll $list1 { if {[lsearch -exact $list2 $ll]!=-1} { lappend relCons [list $ll] } } return $relCons } ## Create two point connector given two points with dimension $dim proc createTwoPt { pt1 pt2 dim } { set creator [pw::Application begin Create] set con [pw::Connector create] set seg [pw::SegmentSpline create] $seg addPoint $pt1 $seg addPoint $pt2 $con addSegment $seg $creator end $con setDimension $dim return $con } ## Calculate split locations for three connectors to create TriQuad domain proc splitTri { conList } { set c1 [lindex $conList 0] set c2 [lindex $conList 1] set c3 [lindex $conList 2] set L1 [expr [$c1 getDimension] - 1 ] set L2 [expr [$c2 getDimension] - 1 ] set L3 [expr [$c3 getDimension] - 1 ] if { $L1 < [expr $L2 + $L3] } { set cond1 1 } else { set cond1 0 } if { $L2 < [expr $L1 + $L3] } { set cond2 1 } else { set cond2 0 } if { $L3 < [expr $L1 + $L2] } { set cond3 1 } else { set cond3 0 } if { $cond1 && $cond2 && $cond3 } { set a [expr {($L1+$L3-$L2)/2. + 1}] set b [expr {($L1+$L2-$L3)/2. + 1}] set c [expr {($L2+$L3-$L1)/2. + 1}] if { $a == [expr int($a)] } { set cc1 1 set a [expr int($a)] } else { set cc1 0 } if { $b == [expr int($b)] } { set cc2 1 set b [expr int($b)] } else { set cc2 0 } if { $c == [expr int($c)] } { set cc3 1 set c [expr int($c)] } else { set cc3 0 } if { $cc1 && $cc2 && $cc3 } { set pt1 [$c1 getXYZ -grid $b] set pt2 [$c2 getXYZ -grid $c] set pt3 [$c3 getXYZ -grid $a] lappend splCon [$c1 split -I $b] lappend splCon [$c2 split -I $c] lappend splCon [$c3 split -I $a] return [list [list $a $b $c] [list $pt1 $pt2 $pt3] $splCon] } else { ## dimensions not even return -1 } } else { ## One dimension is too large return -2 } } ## Create domains proc createTopo { pts dims outerCons } { global input set pt0 [lindex $pts 0] set pt1 [lindex $pts 1] set pt2 [lindex $pts 2] set temp1 [pwu::Vector3 add $pt0 $pt1] set temp2 [pwu::Vector3 add $temp1 $pt2] set cntr [pwu::Vector3 divide $temp2 3.0] set nc1 [createTwoPt $pt0 $cntr [lindex $dims 2]] set nc2 [createTwoPt $pt1 $cntr [lindex $dims 0]] set nc3 [createTwoPt $pt2 $cntr [lindex $dims 1]] set conList [list $nc1 $nc2 $nc3] foreach oc $outerCons { foreach c $oc { lappend conList $c } } set doms [pw::DomainStructured createFromConnectors $conList] if $input(Solve) { solve_Grid $cntr $doms 10 } else { solve_Grid $cntr $doms 0 } return $doms } ## Run elliptic solver for 10 interations with floating BC on interior lines to ## smooth grid proc solve_Grid { cntr doms num } { global interpAngles set solver_mode [pw::Application begin EllipticSolver $doms] if {$interpAngles == 1} { foreach ent $doms { foreach bc [list 1 2 3 4] { $ent setEllipticSolverAttribute -edge $bc \ EdgeAngleCalculation Interpolate } } } for {set ii 0} {$ii<3} {incr ii} { set tempDom [lindex $doms $ii] set inds [list] for {set jj 1 } {$jj <= 4 } {incr jj} { set tmpEdge [$tempDom getEdge $jj] set n1 [$tmpEdge getNode Begin] set n2 [$tmpEdge getNode End] set c1 [pwu::Vector3 equal -tolerance 1e-6 [$n1 getXYZ] $cntr] set c2 [pwu::Vector3 equal -tolerance 1e-6 [$n2 getXYZ] $cntr] if { $c1 || $c2 } { lappend inds [list $jj] } } set temp_list [list] for {set jj 0} {$jj < [llength $inds] } {incr jj} { lappend temp_list [list $tempDom] } foreach ent $temp_list bc $inds { $ent setEllipticSolverAttribute -edge $bc \ EdgeConstraint Floating $ent setEllipticSolverAttribute -edge $bc \ EdgeAngleCalculation Orthogonal } } $solver_mode run $num $solver_mode end return } ## Since final grid is actually two TriQuad grids, can run smoother on all ## domains at very end. proc solve_All { doms num } { set solver_mode [pw::Application begin EllipticSolver $doms] foreach ent $doms { foreach bc [list 1 2 3 4] { $ent setEllipticSolverAttribute -edge $bc \ EdgeConstraint Floating } } $solver_mode run $num $solver_mode end return } ## Main procedure to split two connectors into half-OH topology proc splitSemiCircle { cons } { global input newDoms lowerBound upperBound set con(1) [lindex $cons 0] set con(2) [lindex $cons 1] set L1 [$con(1) getLength -arc 1.0] set L2 [$con(2) getLength -arc 1.0] if {$L2 > $L1} { set sE 1 set lE 2 } else { set sE 2 set lE 1 } set N1 [$con($sE) getDimension] set N2 [$con($lE) getDimension] ## Check parity. If both are odd, no problem, otherwise, connectors must ## be split. Even-dimensioned connectors pose problems. Either re-dimension ## or exclude. input(AutoDim) will automatically increase their dimension. if {[expr $N1%2]==0 || [expr $N2%2] == 0 } { puts "Inconsistent Dimension." if { !$input(AutoDim) } { exit } set dimMode [pw::Application begin Dimension] if {[expr $N1%2] == 0} { incr N1 $con($sE) resetGeneralDistributions $con($sE) setDimension $N1 $dimMode balance -resetGeneralDistributions puts "Re-dimensioned [$con($sE) getName]." } if {[expr $N2%2] == 0} { incr N2 $con($lE) resetGeneralDistributions $con($lE) setDimension $N2 $dimMode balance -resetGeneralDistributions puts "Re-dimensioned [$con($lE) getName]." } $dimMode end } ## Exit if dimensions are too small to support split operations if { $N1 < 5 || $N2 < 5 } { puts "Dimension too small." exit } set N1_split [expr ($N1-1)/2+1] set N2_split [expr ($N2-1)/2+1] set lowerBound [expr abs($N2_split-$N1_split)+2] set upperBound [expr $N1_split+$N2_split-3] set w(Message) [list $lowerBound $upperBound] set N3 [expr $lowerBound+$upperBound] if { [expr $N3%2] != 0 } { incr N3 } set input(sDim) [expr $N3/2] set node1 [$con($sE) getNode Begin] set node2 [$con($sE) getNode End] set param1 [$con($sE) getParameter -closest [pw::Application getXYZ [$con($sE) getXYZ -arc 0.5]]] set tmp_cons1 [$con($sE) split $param1] set param2 [$con($lE) getParameter -closest [pw::Application getXYZ [$con($lE) getXYZ -arc 0.5]]] set tmp_cons2 [$con($lE) split $param2] set pt1 [[lindex $tmp_cons2 0] getXYZ -arc 1.0] set pt2 [[lindex $tmp_cons1 0] getXYZ -arc 1.0] ## Enable GUI if desired if $input(GUI) { makeWindow tkwait window .top } ## Retrieve calculated/specified value for the splitting connector dimension set midDim $input(sDim) if {[expr (($N1+1)/2+($N2+1)/2+$midDim)%2]==0} {incr midDim} set midCon1 [createTwoPt $pt1 $pt2 $midDim] set list1 [getAdjCons $node1 [concat $tmp_cons1 $tmp_cons2]] $midCon1 alignOrientation $list1 lappend list1 [list $midCon1] ## Attempt splitting operation set temp [splitTri $list1] ## Check results of split if {$temp != -1 && $temp != -2} { set dims [lindex $temp 0] set pts [lindex $temp 1] set splCons [lindex $temp 2] set doms1 [createTopo $pts $dims $splCons] } elseif {$temp == -1} { puts "Unable to match dimensions, check edge dimensions." puts "Sum of three connector dimensions must be odd." exit } else { puts "Unable to match dimensions, check edge dimensions." puts "No edge may have a dimension longer than the sum of the other two." } set midCon2 [createTwoPt $pt1 $pt2 $midDim] set list2 [getAdjCons $node2 [concat $tmp_cons1 $tmp_cons2]] $midCon2 alignOrientation $list2 lappend list2 [list $midCon2] ## Attempt splitting operation set temp2 [splitTri $list2] ## Check results of split if {$temp2 != -1 && $temp2 != -2} { set dims [lindex $temp2 0] set pts [lindex $temp2 1] set splCons [lindex $temp2 2] set doms2 [createTopo $pts $dims $splCons] } elseif {$temp2 == -1} { puts "Unable to match dimensions, check edge dimensions." puts "Sum of three connector dimensions must be odd." exit } else { puts "Unable to match dimensions, check edge dimensions." puts "No edge may have a dimension longer than the sum of the other two." } set newDoms [concat $doms1 $doms2] if $input(Solve) { solve_All $newDoms 5 } else { solve_All $newDoms 0 } return } ########################################################################### ## GUI ########################################################################### ## Load TK if {$input(GUI)} { pw::Script loadTk # Initialize globals set infoMessage "" set color(Valid) SystemWindow set color(Invalid) MistyRose set w(Window) [tk::toplevel .top] set w(LabelTitle) .top.title set w(FrameMain) .top.main set w(LabelDimension) $w(FrameMain).ldim set w(EntryDimension) $w(FrameMain).edim set w(LabelSolve) $w(FrameMain).lslv set w(EntrySolve) $w(FrameMain).eslv set w(ButtoncOH) $w(FrameMain).doit set w(FrameButtons) .top.fbuttons set w(Logo) $w(FrameButtons).pwlogo set w(ButtonCancel) $w(FrameButtons).bcancel set w(Message) .top.msg # dimension field validation proc validateDim { dim widget } { global w color input lowerBound upperBound if { [string is integer -strict $dim] && $dim >= $lowerBound && $dim <= $upperBound } { $w($widget) configure -background $color(Valid) } else { $w($widget) configure -background $color(Invalid) } updateButtons return 1 } # return true if none of the entry fields are marked invalid proc canCreate { } { global w color return [expr \ [string equal -nocase [$w(EntryDimension) cget -background] $color(Valid)]] } # enable/disable action buttons based on current settings proc updateButtons { } { global w infoMessage lowerBound upperBound if { [canCreate] } { $w(ButtoncOH) configure -state normal set infoMessage "Press Create OH" } else { $w(ButtoncOH) configure -state disabled set infoMessage "Enter integer between $lowerBound and $upperBound" } update } # set the font for the input widget to be bold and 1.5 times larger than # the default font proc setTitleFont { l } { global titleFont if { ! [info exists titleFont] } { set fontSize [font actual TkCaptionFont -size] set titleFont [font create -family [font actual TkCaptionFont -family] \ -weight bold -size [expr {int(1.5 * $fontSize)}]] } $l configure -font $titleFont } ############################################################################### # pwLogo: Define pointwise logo ############################################################################### proc pwLogo {} { set logoData { R0lGODlheAAYAIcAAAAAAAICAgUFBQkJCQwMDBERERUVFRkZGRwcHCEhISYmJisrKy0tLTIyMjQ0 NDk5OT09PUFBQUVFRUpKSk1NTVFRUVRUVFpaWlxcXGBgYGVlZWlpaW1tbXFxcXR0dHp6en5+fgBi qQNkqQVkqQdnrApmpgpnqgpprA5prBFrrRNtrhZvsBhwrxdxsBlxsSJ2syJ3tCR2siZ5tSh6tix8 ti5+uTF+ujCAuDODvjaDvDuGujiFvT6Fuj2HvTyIvkGKvkWJu0yUv2mQrEOKwEWNwkaPxEiNwUqR xk6Sw06SxU6Uxk+RyVKTxlCUwFKVxVWUwlWWxlKXyFOVzFWWyFaYyFmYx16bwlmZyVicyF2ayFyb zF2cyV2cz2GaxGSex2GdymGezGOgzGSgyGWgzmihzWmkz22iymyizGmj0Gqk0m2l0HWqz3asznqn ynuszXKp0XKq1nWp0Xaq1Hes0Xat1Hmt1Xyt0Huw1Xux2IGBgYWFhYqKio6Ojo6Xn5CQkJWVlZiY mJycnKCgoKCioqKioqSkpKampqmpqaurq62trbGxsbKysrW1tbi4uLq6ur29vYCu0YixzYOw14G0 1oaz14e114K124O03YWz2Ie12oW13Im10o621Ii22oi23Iy32oq52Y252Y+73ZS51Ze81JC625G7 3JG825K83Je72pW93Zq92Zi/35G+4aC90qG+15bA3ZnA3Z7A2pjA4Z/E4qLA2KDF3qTA2qTE3avF 36zG3rLM3aPF4qfJ5KzJ4LPL5LLM5LTO4rbN5bLR6LTR6LXQ6r3T5L3V6cLCwsTExMbGxsvLy8/P z9HR0dXV1dbW1tjY2Nra2tzc3N7e3sDW5sHV6cTY6MnZ79De7dTg6dTh69Xi7dbj7tni793m7tXj 8Nbk9tjl9N3m9N/p9eHh4eTk5Obm5ujo6Orq6u3t7e7u7uDp8efs8uXs+Ozv8+3z9vDw8PLy8vL0 9/b29vb5+/f6+/j4+Pn6+/r6+vr6/Pn8/fr8/Pv9/vz8/P7+/gAAACH5BAMAAP8ALAAAAAB4ABgA AAj/AP8JHEiwoMGDCBMqXMiwocOHECNKnEixosWLGDNqZCioo0dC0Q7Sy2btlitisrjpK4io4yF/ yjzKRIZPIDSZOAUVmubxGUF88Aj2K+TxnKKOhfoJdOSxXEF1OXHCi5fnTx5oBgFo3QogwAalAv1V yyUqFCtVZ2DZceOOIAKtB/pp4Mo1waN/gOjSJXBugFYJBBflIYhsq4F5DLQSmCcwwVZlBZvppQtt D6M8gUBknQxA879+kXixwtauXbhheFph6dSmnsC3AOLO5TygWV7OAAj8u6A1QEiBEg4PnA2gw7/E uRn3M7C1WWTcWqHlScahkJ7NkwnE80dqFiVw/Pz5/xMn7MsZLzUsvXoNVy50C7c56y6s1YPNAAAC CYxXoLdP5IsJtMBWjDwHHTSJ/AENIHsYJMCDD+K31SPymEFLKNeM880xxXxCxhxoUKFJDNv8A5ts W0EowFYFBFLAizDGmMA//iAnXAdaLaCUIVtFIBCAjP2Do1YNBCnQMwgkqeSSCEjzzyJ/BFJTQfNU WSU6/Wk1yChjlJKJLcfEgsoaY0ARigxjgKEFJPec6J5WzFQJDwS9xdPQH1sR4k8DWzXijwRbHfKj YkFO45dWFoCVUTqMMgrNoQD08ckPsaixBRxPKFEDEbEMAYYTSGQRxzpuEueTQBlshc5A6pjj6pQD wf9DgFYP+MPHVhKQs2Js9gya3EB7cMWBPwL1A8+xyCYLD7EKQSfEF1uMEcsXTiThQhmszBCGC7G0 QAUT1JS61an/pKrVqsBttYxBxDGjzqxd8abVBwMBOZA/xHUmUDQB9OvvvwGYsxBuCNRSxidOwFCH J5dMgcYJUKjQCwlahDHEL+JqRa65AKD7D6BarVsQM1tpgK9eAjjpa4D3esBVgdFAB4DAzXImiDY5 vCFHESko4cMKSJwAxhgzFLFDHEUYkzEAG6s6EMgAiFzQA4rBIxldExBkr1AcJzBPzNDRnFCKBpTd gCD/cKKKDFuYQoQVNhhBBSY9TBHCFVW4UMkuSzf/fe7T6h4kyFZ/+BMBXYpoTahB8yiwlSFgdzXA 5JQPIDZCW1FgkDVxgGKCFCywEUQaKNitRA5UXHGFHN30PRDHHkMtNUHzMAcAA/4gwhUCsB63uEF+ bMVB5BVMtFXWBfljBhhgbCFCEyI4EcIRL4ChRgh36LBJPq6j6nS6ISPkslY0wQbAYIr/ahCeWg2f ufFaIV8QNpeMMAkVlSyRiRNb0DFCFlu4wSlWYaL2mOp13/tY4A7CL63cRQ9aEYBT0seyfsQjHedg xAG24ofITaBRIGTW2OJ3EH7o4gtfCIETRBAFEYRgC06YAw3CkIqVdK9cCZRdQgCVAKWYwy/FK4i9 3TYQIboE4BmR6wrABBCUmgFAfgXZRxfs4ARPPCEOZJjCHVxABFAA4R3sic2bmIbAv4EvaglJBACu IxAMAKARBrFXvrhiAX8kEWVNHOETE+IPbzyBCD8oQRZwwIVOyAAXrgkjijRWxo4BLnwIwUcCJvgP ZShAUfVa3Bz/EpQ70oWJC2mAKDmwEHYAIxhikAQPeOCLdRTEAhGIQKL0IMoGTGMgIBClA9QxkA3U 0hkKgcy9HHEQDcRyAr0ChAWWucwNMIJZ5KilNGvpADtt5JrYzKY2t8nNbnrzm+B8SEAAADs=} return [image create photo -format GIF -data $logoData] } # Build the user interface proc makeWindow { } { global w input cons wm withdraw . # Ceate the widgets label $w(LabelTitle) -text "Semi-Circle Parameters" setTitleFont $w(LabelTitle) frame $w(FrameMain) label $w(LabelDimension) -text "Cross dimension:" -anchor e entry $w(EntryDimension) -width 6 -bd 2 -textvariable input(sDim) $w(EntryDimension) configure -state disabled label $w(LabelSolve) -text "Run solver?" -padx 2 -anchor e checkbutton $w(EntrySolve) -variable input(Solve) $w(EntrySolve) configure -state disabled button $w(ButtoncOH) -text "Create Topo" -command { destroy .top } $w(ButtoncOH) configure -state disabled message $w(Message) -textvariable infoMessage -background beige \ -bd 2 -relief sunken -padx 5 -pady 5 -anchor w \ -justify left -width 300 frame $w(FrameButtons) -relief sunken button $w(ButtonCancel) -text "Cancel" -command { destroy . } label $w(Logo) -image [pwLogo] -bd 0 -relief flat # set up validation after all widgets are created so that they all exist when # validation fires the first time; if they don't all exist, updateButtons # will fail $w(EntryDimension) configure -validate key \ -vcmd { validateDim %P EntryDimension } # lay out the form pack $w(LabelTitle) -side top pack [frame .sp -bd 1 -height 2 -relief sunken] -pady 4 -side top -fill x pack $w(FrameMain) -side top -fill both -expand 1 # lay out the form in a grid grid $w(LabelDimension) $w(EntryDimension) -sticky ew -pady 3 -padx 3 grid $w(LabelSolve) $w(EntrySolve) -sticky ew -pady 3 -padx 3 grid $w(ButtoncOH) -columnspan 2 -pady 3 # give all extra space to the second (last) column grid columnconfigure $w(FrameMain) 1 -weight 1 pack $w(Message) -side bottom -fill x -anchor s pack $w(FrameButtons) -fill x -side bottom -padx 2 -pady 4 -anchor s pack $w(ButtonCancel) -side right -padx 2 pack $w(Logo) -side left -padx 5 bind .top <Key-Escape> { $w(ButtonCancel) invoke } bind .top <Control-Key-Return> { $w(ButtoncOH) invoke } bind .top <Control-Key-f> { $w(ButtoncOH) invoke } bind $w(EntryDimension) <Key-Return> { $w(ButtoncOH) invoke } # move keyboard focus to the first entry focus $w(ButtoncOH) raise .top $w(EntryDimension) configure -state normal $w(EntrySolve) configure -state normal updateButtons } } ## Set Info label set text1 "Please select two connectors or one unstructured domain." ## Pull entities from current selection set mask [pw::Display createSelectionMask -requireDomain {Unstructured} -requireConnector {}] ############################################### ## This script uses the getSelectedEntities command added in 17.2R2 ## Catch statement should check for previous versions if { [catch {pw::Display getSelectedEntities -selectionmask $mask curSelection}] } { set picked [pw::Display selectEntities -description $text1 \ -selectionmask $mask curSelection] if {!$picked} { puts "Script aborted." exit } } elseif { [llength $curSelection(Connectors)] != 2 && \ [llength $curSelection(Domains)] != 1 } { puts $text1 exit } ############################################### ## First check for unstructured domain in selection. If so, replace with half-OH if {[llength $curSelection(Domains)]==1} { set tempDom [lindex $curSelection(Domains) 0] set edgeCount [$tempDom getEdgeCount] if { $edgeCount != 1 } { puts "Domain has multiple edges." exit } set temp [$tempDom getEdge 1] set conCount [$temp getConnectorCount] if { $conCount != 2 } { puts "Domain edge has more than 2 connectors." exit } set cons [list [$temp getConnector 1] [$temp getConnector 2]] set domStatus [list [$tempDom getRenderAttribute LineMode]\ [$tempDom getRenderAttribute FillMode]] set newDoms [splitSemiCircle $cons] pw::Entity delete $tempDom foreach dd $newDoms { $dd setRenderAttribute LineMode [lindex $domStatus 0] $dd setRenderAttribute FillMode [lindex $domStatus 1] } exit } elseif {[llength $curSelection(Connectors)]==2} { set bool [isLoop $curSelection(Connectors)] if $bool { set cons $curSelection(Connectors) set newDoms [splitSemiCircle $curSelection(Connectors)] } else { puts "Connectors do not form closed loop." } exit } else { puts "Please select either one unstructured domain or two connectors." exit } # # DISCLAIMER: # TO THE MAXIMUM EXTENT PERMITTED BY APPLICABLE LAW, POINTWISE DISCLAIMS # ALL WARRANTIES, EITHER EXPRESS OR IMPLIED, INCLUDING, BUT NOT LIMITED # TO, IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR # PURPOSE, WITH REGARD TO THIS SCRIPT. TO THE MAXIMUM EXTENT PERMITTED # BY APPLICABLE LAW, IN NO EVENT SHALL POINTWISE BE LIABLE TO ANY PARTY # FOR ANY SPECIAL, INCIDENTAL, INDIRECT, OR CONSEQUENTIAL DAMAGES # WHATSOEVER (INCLUDING, WITHOUT LIMITATION, DAMAGES FOR LOSS OF # BUSINESS INFORMATION, OR ANY OTHER PECUNIARY LOSS) ARISING OUT OF THE # USE OF OR INABILITY TO USE THIS SCRIPT EVEN IF POINTWISE HAS BEEN # ADVISED OF THE POSSIBILITY OF SUCH DAMAGES AND REGARDLESS OF THE # FAULT OR NEGLIGENCE OF POINTWISE. #
Glyph
4
smola/language-dataset
data/github.com/pointwise/Semicircle/a0e1662231fc57083a0b74ab98f1013e546bc549/Semicircle.glf
[ "MIT" ]
{% set list = ['lmno','efgh','Ijk','Pqrs','Abcd'] %} {% set result = list | sorted_ignorecase() %} {% include 'jinja_filters/common.sls' %}
SaltStack
3
byteskeptical/salt
tests/integration/files/file/base/jinja_filters/data_sorted_ignorecase.sls
[ "Apache-2.0" ]
-- Copyright 2020-2021 Jeff Foley. All rights reserved. -- Use of this source code is governed by Apache 2 LICENSE that can be found in the LICENSE file. local url = require("url") local json = require("json") name = "GoogleCT" type = "cert" local hdrs={ Connection="close", Referer="https://transparencyreport.google.com/https/certificates", } function vertical(ctx, domain) local token = "" while (true) do local page, err = request(ctx, { ['url']=build_url(domain, token), headers=hdrs, }) if (err ~= nil and err ~= "") then log(ctx, "vertical request to service failed: " .. err) break end local j = json.decode("{\"results\": " .. page:gsub('^.*\n\n', "") .. " }") if (j ~= nil and #(j.results[1][2]) > 0) then for _, cert in ipairs(j.results[1][2]) do get_cert_details(ctx, cert[1], cert[5]) end end token = get_token(page) if (token == "") then break end end end function build_url(domain, token) local base = "https://www.google.com/transparencyreport/api/v3/httpsreport/ct/certsearch" if token ~= "" then base = base .. "/page" end local params = { ['domain']=domain, ['include_expired']="true", ['include_subdomains']="true", } if token ~= "" then params['p'] = token end return base .. "?" .. url.build_query_string(params) end function get_token(content) local token = "" local pattern = '\\[(null|"[a-zA-Z0-9]+"),"([a-zA-Z0-9]+)",null,([0-9]+),([0-9]+)\\]' local matches = submatch(content, pattern) if (matches == nil or #matches == 0) then return token end local match = matches[1] if (match ~= nil and #match == 5 and (tonumber(match[4]) <= tonumber(match[5]))) then token = match[3] end return token end function get_cert_details(ctx, common, hash) if in_scope(ctx, common) then new_name(ctx, common) end local base = "https://www.google.com/transparencyreport/api/v3/httpsreport/ct/certbyhash" local u = base .. "?" .. url.build_query_string({['hash']=hash}) local resp, err = request(ctx, { ['url']=u, headers=hdrs, }) if (err ~= nil and err ~= "") then log(ctx, "get_cert_details request to service failed: " .. err .. ", URL: " .. u) return end local j = json.decode("{\"results\": " .. resp:gsub('^.*\n\n', "") .. " }") if (j == nil or #(j.results[1][2][6]) == 0) then return end for _, name in ipairs(j.results[1][2][6]) do if in_scope(ctx, name) then new_name(ctx, name) end end end
Ada
4
Elon143/Amass
resources/scripts/cert/googlect.ads
[ "Apache-2.0" ]
MEMORY { FLASH_TEXT (rw) : ORIGIN = 0x00000000 + 0x1C000, LENGTH = 0x80000 - 0x1C000 RAM (xrw) : ORIGIN = 0x20000000 + 0x1e20, LENGTH = 0x20000 - 0x1e20 } _stack_size = 4K + __softdevice_stack; /* These values are needed for the Nordic SoftDevice. */ __app_ram_base = ORIGIN(RAM); __softdevice_stack = DEFINED(__softdevice_stack) ? __softdevice_stack : 0; INCLUDE "targets/arm.ld"
Linker Script
3
attriaayush/tinygo
targets/nrf52833-s113v7.ld
[ "Apache-2.0" ]
<article class="news_item"> <header class="news_item-header"> <p class="news_item-source"> <%= render_source_image(@conn, @item) %> <%= render_source_name(@conn, @item) %> </p> <h2 class="news_item-title"><%= @item.headline %></h2> </header> <div class="news_item-toolbar"> <div class="news_item-toolbar-item news_item-toolbar-meta"> </div> </div> </article>
HTML+EEX
3
PsOverflow/changelog.com
lib/changelog_web/templates/news_item/_summary_upcoming.html.eex
[ "MIT" ]
'reach 0.1'; export const main = Reach.App( { }, [Participant('Alice', {}), Participant('Bob', {}), ], (Alice, Bob) => { closeTo(Bob, each([Alice, Bob], () => { interact.showResult(5); })); });
RenderScript
3
chikeabuah/reach-lang
hs/t/n/Err_Invalid_Statement.rsh
[ "Apache-2.0" ]
--# -path=.:../abstract:../common:../../prelude concrete StructuralTur of Structural = CatTur ** open ResTur, ParadigmsTur, Prelude in { flags optimize=all ; coding = utf8 ; lin he_Pron = mkPron "o" "onu" "ona" "onun" "onda" "ondan" "onlu" "onsuz" Sg P3 ; i_Pron = mkPron "ben" "beni" "bana" "benim" "bende" "benden" "benli" "bensiz" Sg P1 ; it_Pron = mkPron "o" "onu" "ona" "onun" "onda" "ondan" "onlu" "onsuz" Sg P3 ; she_Pron = mkPron "o" "onu" "ona" "onun" "onda" "ondan" "onlu" "onsuz" Sg P3 ; that_Quant = mkQuant "o" ; they_Pron = mkPron "onlar" "onları" "onlara" "onların" "onlarda" "onlardan" "onlarlı" "onlarsız" Pl P3 ; this_Quant = mkQuant "bu" ; we_Pron = mkPron "biz" "bizi" "bize" "bizim" "bizde" "bizden" "bizli" "bizsiz" Pl P1 ; youSg_Pron = mkPron "sen" "seni" "sana" "senin" "sende" "senden" "senli" "sensiz" Sg P2 ; youPl_Pron = mkPron "siz" "sizi" "size" "sizin" "sizde" "sizden" "sizli" "sizsiz" Pl P2 ; youPol_Pron = mkPron "siz" "sizi" "size" "sizin" "sizde" "sizden" "sizli" "sizsiz" Pl P2 ; with_Prep = mkPrep [] (Abess Pos) ; -- ...den sonra after_Prep = mkPrep "sonra" Ablat ; -- ...den önce before_Prep = mkPrep "önce" Ablat ; -- ...nin üzerinde above_Prep = mkPrep "üzerinde" Gen ; -- ..nin arkasında behind_Prep = mkPrep "arkasında" Gen ; -- ...nin üzerinde -- ...nin üstünde on_Prep = variants {mkPrep "üzerinde" Gen; mkPrep "üstünde" Gen} ; in_Prep = variants {mkPrep "içinde" Gen; mkPrep "içerisinde" Gen} ; -- ... sırasında during_Prep = mkPrep "sırasında" Nom ; -- ... ile ...nin arasında between_Prep = mkPrep "arasındaki" Gen ; and_Conj = ss "ile" ; or_Conj = ss "veya" ; yes_Utt = ss "evet" ; no_Utt = ss "hayır" ; always_AdV = {s = "her zaman"} ; but_PConj = ss "ama" ; at_most_AdN = ss "en fazla" ; at_least_AdN = ss "en az" ; as_CAdv = {s = "kadar"; p = "kadar"} ; }
Grammatical Framework
4
drbean/GF
lib/src/turkish/StructuralTur.gf
[ "BSD-3-Clause" ]
// TARGET_BACKEND: JVM_OLD interface Base1 { fun getX(): Int } interface Base2 { val x: Int get() = 1 } interface <!CONFLICTING_INHERITED_JVM_DECLARATIONS, CONFLICTING_INHERITED_JVM_DECLARATIONS!>Test<!> : Base1, Base2
Kotlin
3
Mu-L/kotlin
compiler/testData/diagnostics/testsWithJvmBackend/duplicateJvmSignature/traitImpl/defaultVsNonDefault_old.kt
[ "ECL-2.0", "Apache-2.0" ]
# RUN: llc -run-pass=peephole-opt %s -o - -verify-machineinstrs | FileCheck %s # The and -> ands transform is sensitive to scheduling; make sure we don't # transform cases which aren't legal. # CHECK-LABEL: name: foo_transform # CHECK: %2:gpr = ANDri %0, 1, 14, $noreg, def $cpsr # CHECK-NEXT: %3:gpr = MOVCCi16 %1, 5, 0, $cpsr # CHECK-LABEL: name: foo_notransform # CHECK: TSTri %0, 1, 14, $noreg, implicit-def $cpsr # CHECK-NEXT: %2:gpr = MOVCCi16 %1, 5, 0, $cpsr --- | target triple = "armv7-unknown-unknown" define i32 @foo_transform(i32 %in) { ret i32 undef } define i32 @foo_notransform(i32 %in) { ret i32 undef } ... --- name: foo_transform tracksRegLiveness: true body: | bb.0 (%ir-block.0): liveins: $r0 %1:gpr = COPY $r0 %2:gpr = MOVi 4, 14, $noreg, $noreg %4:gpr = ANDri %1:gpr, 1, 14, $noreg, $noreg TSTri %1:gpr, 1, 14, $noreg, implicit-def $cpsr %3:gpr = MOVCCi16 %2, 5, 0, $cpsr $r0 = COPY killed %3 $r1 = COPY killed %4 BX_RET 14, $noreg, implicit $r0, implicit $r1 ... name: foo_notransform tracksRegLiveness: true body: | bb.0 (%ir-block.0): liveins: $r0 %1:gpr = COPY $r0 %2:gpr = MOVi 4, 14, $noreg, $noreg TSTri %1:gpr, 1, 14, $noreg, implicit-def $cpsr %3:gpr = MOVCCi16 %2, 5, 0, $cpsr %4:gpr = ANDri %1:gpr, 1, 14, $noreg, $noreg $r0 = COPY killed %3 $r1 = COPY killed %4 BX_RET 14, $noreg, implicit $r0, implicit $r1
Mirah
3
medismailben/llvm-project
llvm/test/CodeGen/ARM/tst-peephole.mir
[ "Apache-2.0" ]
# The INPUT HEADER is scanned for declarations # LIBNAME INPUT HEADER ERROR-TABLE FILE L OSSLTEST e_ossltest_err.h e_ossltest_err.c
eC
2
xumia/debian-openssl
engines/e_ossltest.ec
[ "OpenSSL" ]
open function variable x : list nat #check x^.map (+1) #check x^.foldl (+) 0 def f (l : list (nat × nat)) : list nat := l^.map (λ ⟨a, b⟩, a + b) example : [(1,2), (3,4)]^.map (uncurry (+)) = [3, 7] := rfl example : [(1,2), (3,4)]^.map (λ ⟨a, b⟩, a + b) = [3, 7] := rfl instance decidable_uncurry_pred{α} (p : α → α → Prop) [decidable_rel p] : decidable_pred (uncurry p) := λ a, by { cases a; dsimp [uncurry]; apply_instance } example : [(1,2), (4,3), (3, 2), (0, 2), (5, 4)]^.filter (uncurry (>)) = [(4,3), (3,2), (5, 4)] := rfl example : [(1,2), (4,3)]^.foldl (λ v ⟨a, b⟩, v + a) 0 = 5 := rfl
Lean
4
ericrbg/lean
tests/lean/run/as_is_elab.lean
[ "Apache-2.0" ]
.svg-content= image_tag 'illustrations/no-packages.svg' .text-content %h4.text-center= _('There are no packages yet') %p - no_packages_url = help_page_path('administration/packages/index') - no_packages_link_start = '<a href="%{url}" target="_blank" rel="noopener noreferrer">'.html_safe % { url: no_packages_url } = _('Learn how to %{no_packages_link_start}publish and share your packages%{no_packages_link_end} with GitLab.').html_safe % { no_packages_link_start: no_packages_link_start, no_packages_link_end: '</a>'.html_safe }
Haml
4
glimmerhq/glimmerhq
app/views/shared/packages/_no_packages.html.haml
[ "MIT" ]
""" We define base classes that will be inherited by Timestamp, Timedelta, etc in order to allow for fast isinstance checks without circular dependency issues. This is analogous to core.dtypes.generic. """ from cpython.datetime cimport datetime cdef class ABCTimestamp(datetime): pass
Cython
3
CJL89/pandas
pandas/_libs/tslibs/base.pyx
[ "BSD-3-Clause" ]
(module (import "env" "printInt" (func $printInt (param i32))) (import "env" "print" (func $print (param i32 i32))) (memory $memory 1) (data (i32.const 0) "\n") (data (i32.const 1) " ") (func $endl (call $print (i32.const 0) (i32.const 1))) (func $space (call $print (i32.const 1) (i32.const 1))) (func $fibonacci_rec (param $a i32) (param $b i32) (param $n i32) (result i32) (if (i32.eqz (get_local $n)) (return (get_local $a))) (call $printInt (get_local $b)) (call $space) (set_local $a (i32.add (get_local $a) (get_local $b))) (call $fibonacci_rec (get_local $b) (get_local $a) (i32.sub (get_local $n) (i32.const 1))) ) (func $fibonacci_iter (param $a i32) (param $b i32) (param $n i32) (result i32) (loop $fi (if (i32.eqz (get_local $n)) (return (get_local $a))) (call $printInt (get_local $b)) (call $space) (set_local $b (i32.add (get_local $a) (get_local $b))) (set_local $a (i32.sub (get_local $b) (get_local $a))) (set_local $n (i32.sub (get_local $n) (i32.const 1))) (br $fi)) (get_local $b)) (func $main (drop (call $fibonacci_rec (i32.const 0) (i32.const 1) (i32.const 9))) (call $endl) (drop (call $fibonacci_iter (i32.const 0) (i32.const 1) (i32.const 9)))) (export "main" (func $main)) (export "memory" (memory $memory)) )
WebAssembly
4
JavascriptID/sourcerer-app
src/test/resources/samples/langs/WebAssembly/fibonacci.wat
[ "MIT" ]
import { Node, Literal, Identifier, MemberExpression } from 'estree'; export function compare_node(a: Node | void, b: Node | void) { if (a === b) return true; if (!a || !b) return false; if (a.type !== b.type) return false; switch (a.type) { case 'Identifier': return a.name === (b as Identifier).name; case 'MemberExpression': return ( compare_node(a.object, (b as MemberExpression).object) && compare_node(a.property, (b as MemberExpression).property) && a.computed === (b as MemberExpression).computed ); case 'Literal': return a.value === (b as Literal).value; } }
TypeScript
4
Theo-Steiner/svelte
src/compiler/compile/utils/compare_node.ts
[ "MIT" ]
<cfoutput> #writeDump(now(), 'HH:mm:ss')# </cfoutput>
ColdFusion CFC
1
tonym128/CFLint
src/test/resources/com/cflint/tests/WriteDumpChecker/output_hash_625.cfc
[ "BSD-3-Clause" ]
#include "colors.inc" #include "textures.inc" #include "shapes.inc" #include "metals.inc" #include "glass.inc" #include "woods.inc" global_settings {max_trace_level 1000} camera { //Some other interesting angles to look at the cube from in comments: location <-22, 16, -25> // location <-0.1, 0.3, -0.4> // location <-1, 3, -4> // location <-2, 6, -5> // location <0, 0, -35> //If we want an animation: // location <clock * -22, clock * 16, clock * -25> direction <0, 0, 2.25> right x*1.33 look_at <0,0,0> } light_source {< -50, 25, -50> color rgb <1.0, 1.0, 1.0> //Some parameters to play with in comments: // fade_distance Dist fade_power 2 // area_light <-40, 0, -40>, <40, 0, 40>, 3, 3 // adaptive 1 // jitter } #declare LogoColor = pigment { color rgb <1.0, 0.0, 0.0> } #declare LogoTexture = texture { LogoColor finish { specular 0.65 roughness 0.1 ambient 0.3 reflection 0.55 } translate x*1 rotate <15, 10, 0> translate y*2 } #declare LEG_DIAMETER = 0.35; #declare Leg = union { sphere { <1.5, 1.5, -0.75>, LEG_DIAMETER texture { LogoTexture } } cylinder { <1.5, 1.5, -0.75>, <-1.5, 1.5, -0.75>, LEG_DIAMETER texture { LogoTexture } } sphere { <-1.5, 1.5, -0.75>, LEG_DIAMETER texture { LogoTexture } } } #declare DotLeg = union { object { Leg } sphere { <2 + LEG_DIAMETER, 1.5, -0.75>, LEG_DIAMETER texture { LogoTexture } } sphere { <-2 + -LEG_DIAMETER, 1.5, -0.75>, LEG_DIAMETER texture { LogoTexture } } } #declare VertLeg = object { Leg rotate <0,0,90> } #declare HorizBox = union { object { DotLeg translate <0, 0, 0.5> } object { Leg rotate <0, 90, 0> translate <-1.05 + -LEG_DIAMETER + -LEG_DIAMETER/2, 0, 2.1> } object { Leg rotate <0, 90, 0> translate <3.1, 0, 2.1> } object { DotLeg translate <0, 0, 5.17> } } #declare Logo = union { object { HorizBox translate y*LEG_DIAMETER + y*LEG_DIAMETER translate y*-5.17 } object { HorizBox translate y*0 } object { VertLeg translate <-LEG_DIAMETER*2, -LEG_DIAMETER + -LEG_DIAMETER, LEG_DIAMETER + LEG_DIAMETER/2> } object { VertLeg translate <-LEG_DIAMETER*2, -LEG_DIAMETER + -LEG_DIAMETER , 5.17> } object { VertLeg translate <3.8, -LEG_DIAMETER + -LEG_DIAMETER, LEG_DIAMETER + LEG_DIAMETER/2> } object { VertLeg translate <3.8, -LEG_DIAMETER + -LEG_DIAMETER , 5.17> } } #declare OTHERS = union { object { Logo translate <-10, 0, 0> } object { Logo translate <-10, -10, 0> } object { Logo translate <-10, -10, -10> } object { Logo translate <10, 0, 0> } object { Logo translate <10, -10, 0> } object { Logo translate <10, 10, 10> } } object { Logo }
POV-Ray SDL
4
Cenbe/netbeans-website
netbeans.apache.org/src/content/tutorials/images/sample.pov
[ "Apache-2.0" ]
HEADERS += \ $$PWD/appconfig.h \ $$PWD/appdata.h SOURCES += \ $$PWD/appconfig.cpp \ $$PWD/appdata.cpp
QMake
3
XSxiesi/qt
comtool/api/api.pri
[ "MulanPSL-1.0" ]
using Uno; using Uno.Compiler; using Uno.Testing; using Fuse.Animations; using FuseTest; namespace Fuse.Test { public class EasingTest : TestBase { static float EvaluateAt(Easing e, float k) { return (float)e.Map(k); } static void TestEasingMode(Easing e, float2[] vals, [CallerFilePath] string filePath = "", [CallerLineNumber] int lineNumber = 0, [CallerMemberName] string memberName = "") { foreach (var val in vals) Assert.AreEqual(val.Y, EvaluateAt(e, val.X), Assert.ZeroTolerance, filePath, lineNumber, memberName); } [Test] public void QuadraticInOut() { TestEasingMode(Easing.QuadraticInOut, new float2[] { float2(0.0f, 0.0f), float2(0.25f, 0.125f), float2(0.5f, 0.5f), float2(0.75f, 0.875f), float2(1.0f, 1.0f) }); } [Test] public void CubicInOut() { TestEasingMode(Easing.CubicInOut, new float2[] { float2(0.0f, 0.0f), float2(0.25f, 0.0625f), float2(0.5f, 0.5f), float2(0.75f, 0.9375f), float2(1.0f, 1.0f) }); } [Test] public void QuarticInOut() { TestEasingMode(Easing.QuarticInOut, new float2[] { float2(0.0f, 0.0f), float2(0.25f, 0.03125f), float2(0.5f, 0.5f), float2(0.75f, 0.96875f), float2(1.0f, 1.0f) }); } [Test] public void QuinticInOut() { TestEasingMode(Easing.QuinticInOut, new float2[] { float2(0.0f, 0.0f), float2(0.125f, 0.0004882813f), float2(0.25f, 0.015625f), float2(0.375f, 0.1186523f), float2(0.5f, 0.5f), float2(0.625f, 0.8813477f), float2(0.75f, 0.984375f), float2(0.875f, 0.9995117f), float2(1.0f, 1.0f) }); } [Test] public void ExponentialInOut() { TestEasingMode(Easing.ExponentialInOut, new float2[] { float2(0.0f, 0.0f), float2(0.125f, 0.0027621f), float2(0.25f, 0.015625f), float2(0.375f, 0.0883883f), float2(0.5f, 0.5f), float2(0.625f, 0.9116117f), float2(0.75f, 0.984375f), float2(0.875f, 0.9972379f), float2(1.0f, 1.0f) }); } [Test] public void CircularInOut() { TestEasingMode(Easing.CircularInOut, new float2[] { float2(0.0f, 0.0f), float2(0.25f, 0.0669873f), float2(0.5f, 0.5f), float2(0.75f, 0.9330127f), float2(1.0f, 1.0f) }); } [Test] public void ElasticIn() { TestEasingMode(Easing.ElasticIn, new float2[] { float2(0.0f, 0.0f), float2(0.125f, 0.0008888f), float2(0.25f, 0.0039063f), float2(0.375f, -0.0121389f), float2(0.5f, 0.0f), float2(0.625f, 0.0686678f), float2(0.75f, -0.125f), float2(0.875f, -0.1608986f), float2(1.0f, 1.0f) }); } [Test] public void ElasticOut() { TestEasingMode(Easing.ElasticOut, new float2[] { float2(0.0f, 0.0f), float2(0.125f, 1.1608986f), float2(0.25f, 1.125f), float2(0.375f, 0.9313322f), float2(0.5f, 1.0f), float2(0.625f, 1.0121388f), float2(0.75f, 0.9960938f), float2(0.875f, 0.9991112f), float2(1.0f, 1.0f) }); } [Test] public void ElasticInOut() { TestEasingMode(Easing.ElasticInOut, new float2[] { float2(0.0f, 0.0f), float2(0.125f, 0.0019531f), float2(0.25f, 0.0f), float2(0.375f, -0.0625f), float2(0.5f, 0.5f), float2(0.625f, 1.0625f), float2(0.75f, 1.0f), float2(0.875f, 0.9980469f), float2(1.0f, 1.0f) }); } [Test] public void BackInOut() { TestEasingMode(Easing.BackInOut, new float2[] { float2(0.0f, 0.0f), float2(0.125f, -0.0530057f), float2(0.25f, -0.0996818f), float2(0.375f, 0.0284829f), float2(0.5f, 0.5f), float2(0.625f, 0.9715171f), float2(0.75f, 1.0996819f), float2(0.875f, 1.0530057f), float2(1.0f, 1.0f) }); } [Test] public void BounceOut() { TestEasingMode(Easing.BounceOut, new float2[] { float2(0.0f, 0.0f), float2(0.125f, 0.1181641f), float2(0.25f, 0.4726563f), float2(0.375f, 0.9697266f), float2(0.5f, 0.7656250f), float2(0.625f, 0.7978516f), float2(0.75f, 0.9726539f), float2(0.875f, 0.9619125f), float2(1.0f, 1.0f) }); } } }
Uno
4
helilabs/fuselibs
Source/Fuse.Animations/Tests/Easing.Test.uno
[ "MIT" ]
/** * Licensed to the Apache Software Foundation (ASF) under one * or more contributor license agreements. See the NOTICE file * distributed with this work for additional information * regarding copyright ownership. The ASF licenses this file * to you under the Apache License, Version 2.0 (the * "License"); you may not use this file except in compliance * with the License. You may obtain a copy of the License at * * http://www.apache.org/licenses/LICENSE-2.0 * * Unless required by applicable law or agreed to in writing, software * distributed under the License is distributed on an "AS IS" BASIS, * WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. * See the License for the specific language governing permissions and * limitations under the License. */ package org.apache.hadoop.mapred; /** * This aspect is used for NOT starting the job initialization threads of the capacity scheduler. * We schedule the body of these threads manually from the SimulatorJobTracker according to * simulation time. */ public aspect JobInitializationPollerAspects { pointcut overrideInitializationThreadStarts () : (target (JobInitializationPoller) || target (JobInitializationPoller.JobInitializationThread)) && call (public void start()); void around() : overrideInitializationThreadStarts () { // no-op } }
AspectJ
3
dm20/hadoop-mapreduce
src/contrib/mumak/src/java/org/apache/hadoop/mapred/JobInitializationPollerAspects.aj
[ "Apache-2.0" ]
--TEST-- Bug #45280 (Reflection of instantiated COM classes causes PHP to crash) --EXTENSIONS-- com_dotnet --FILE-- <?php $dict = new COM("Scripting.Dictionary"); $reflection = new ReflectionObject($dict); ob_start(); echo $reflection; ob_get_clean(); echo 'done'; ?> --EXPECT-- done
PHP
3
NathanFreeman/php-src
ext/com_dotnet/tests/bug45280.phpt
[ "PHP-3.01" ]
CJK_WORD 东非/ns/dong fei/null 中华/ns/zhong hua/null 中华/ns/zhong hua/null 中华人民共和国/ns/zhong hua ren min gong he guo/null 中华民国/ns/zhong hua min guo/null 中国/ns/zhong guo/null 中國/nz/zhong guo/null 中非/ns/zhong fei/null 乌克兰/ns/wu ke lan/null 也门/ns/ye men/null 以色列/ns/yi se lie/null 伊拉克/ns/yi la ke/null 伊朗/ns/yi lang/null 俄罗斯/ns/e luo si/null 分类/ns/fen lei/null 加拿大/ns/jia na da/null 南非/ns/nan fei/null 古巴/ns/gu ba/null 台湾/ns/tai wan/null 埃及/ns/ai ji/null 塞尔维亚/ns/sai er wei ya/null 墨西哥/ns/mo xi ge/null 威尔士/ns/wei er shi/null 尼日利亚/ns/ni ri li ya/null 巴比伦/ns/ba bi lun/null 希腊/ns/xi la/null 德国/ns/de guo/null 德意志/ns/de yi zhi/null 意大利/ns/yi da li/null 捷克/ns/jie ke/null 日本/ns/ri ben/null 朝鲜/ns/chao xian/null 比利时/ns/bi li shi/null 法兰西/ns/fa lan xi/null 法国/ns/fa guo/null 波兰/ns/bo lan/null 波黑/ns/bo hei/null 瑞典/ns/rui dian/null 瑞士/ns/rui shi/null 白俄罗斯/ns/bai e luo si/null 缅甸/ns/mian dian/null 美利坚/ns/mei li jian/null 美利坚合众国/ns/mei li jian he zhong guo/null 美国/ns/mei guo/null 老挝/ns/lao wo/null 苏格兰/ns/su ge lan/null 苏联/ns/su lian/null 英国/ns/ying guo/null 英格兰/ns/ying ge lan/null 葡萄牙/ns/pu tao ya/null 蒙古/ns/meng gu/null 西班牙/ns/xi ban ya/null 越南/ns/yue nan/null 韩国/ns/han guo/null #added at 2015-10-23 中国/ns/zhong guo/null 蒙古/ns/meng gu/null 朝鲜/ns/chao xian/null 韩国/ns/han guo/null 日本/ns/ri ben/null 菲律宾/ns/fei lv bin/null 越南/ns/yue nan/null 老挝/ns/lao wo/null 柬埔寨/ns/jian pu zhai/null 缅甸/ns/mian dian/null 泰国/ns/tai guo/null 马来西亚/ns/ma lai xi ya/null 文莱/ns/wen lai/null 新加坡/ns/xin jia po/null 印度尼西亚/ns/yin du ni xi ya/null 东帝汶/ns/dong di wen/null 尼泊尔/ns/ni bo er/null 不丹/ns/bu dan/null 孟加拉国/ns/meng jia la guo/null 印度/ns/yin du/null 巴基斯坦/ns/ba ji si tan/null 斯里兰卡/ns/si li lan ka/null 马尔代夫 /ns/ma er dai fu/null 哈萨克斯坦/ns/ha sa ke si tan/null 吉尔吉斯斯坦/ns/ji er ji si si tan/null 塔吉克斯坦/ns/ta ji ke si tan/null 乌兹别克斯坦/ns/wu zi bie ke si tan/null 土库曼斯坦 /ns/tu ku man si tan/null 阿富汗/ns/a fu han/null 叙利亚/ns/xu li ya/null 约旦/ns/yue dan/null 黎巴嫩/ns/li ba nen/null 巴勒斯坦/ns/ba le si tan/null 沙特阿拉伯/ns/sha te a la bo/null 巴林/ns/ba lin/null 卡塔尔/ns/ka ta er/null 科威特/ns/ke wei te/null 阿拉伯联合酋长国/ns/a la bo lian he qiu zhang guo/null 阿曼/ns/a man/null 也门/ns/ye man/null 格鲁吉亚/ns/ge lu ji ya/null 亚美尼亚/ns/ya mei ni ya/null 阿塞拜疆/ns/a sai bai jiang/null 土耳其/ns/tu er qi/null 塞浦路斯/ns/sai pu lu si/null 芬兰/ns/fen lan/null 瑞典/ns/rui dian/null 挪威/ns/nuo wei/null 冰岛/ns/bing dao/null 丹麦/ns/dan mai/null 法罗群岛/ns/fa luo qun dao/null 爱沙尼亚/ns/a sha ni ya/null 拉脱维亚/ns/la tuo wei ya/null 立陶宛/ns/li tao wan/null 白俄罗斯/ns/bai e luo si/null 俄罗斯/ns/e luo si/null 乌克兰/ns/wu ke lan/null 摩尔多瓦 /ns/mo er duo wa/null 斯洛伐克/ns/si luo fa ke/null 匈牙利/ns/xiong ya li/null 奥地利/ns/ao di li/null 列支敦士登/ns/lie zhi dun shi deng/null 爱尔兰/ns/ai er lan/null 荷兰/ns/he lan/null 卢森堡/ns/lu sen bao/null 摩纳哥 /ns/mo na ge/null 罗马尼亚/ns/luo ma ni ya/null 保加利亚/ns/bao jia li ya/null 马其顿/ns/ma qi dun/null 阿尔巴尼亚/ns/a er ba ni ya/null 斯洛文尼亚/ns/si luo wen ni ya/null 克罗地亚/ns/ke luo di ya/null 波斯尼亚和墨塞哥维那/ns/bo si ni ya he mo sai ge ni ya/null 梵蒂冈/ns/fan di gang/null 圣马力诺/ns/sheng ma li nuo/null 马耳他/ns/ma qi ta/null 安道尔/ns/an dao er/null 利比亚/ns/li bi ya/null 苏丹/ns/su dan/null 突尼斯/ns/tu ni si/null 阿尔及利亚/ns/a er ji li ya/null 摩洛哥/ns/mo luo ge/null 亚速尔群岛/ns/ya su er qun dao/null 马德拉群岛/ns/ma de la qun dao/null 埃塞俄比亚/ns/ai sai e bi ya/null 厄立特里亚/ns/e li te li ya/null 索马里/ns/suo ma li/null 吉布提/ns/ji bu ti/null 肯尼亚/ns/ken ni ya/null 坦桑尼亚/ns/tan sang ni ya/null 乌干达/ns/wu gan da/null 卢旺达/ns/lu wang da/null 布隆迪/ns/bu long di/null 塞舌尔/ns/sai she er/null 刚果/ns/gang guo/null 刚果共和国/ns/gang guo gong he guo/null 圣多美及普林西比/ns/sheng duo mei ji pu lin xi bi/null 塞内加尔/ns/sai er jia er/null 冈比亚/ns/gang bi ya/null 马里/ns/ma li/null 布基纳法索/ns/bu ji na fa suo/null 几内亚/ns/ji nei ya/null 几内亚比绍/ns/ji nei ya bi shao/null 佛得角/ns/fo de jiao/null 塞拉利昂/ns/sai la li ang/null 利比里亚/ns/li bi li ya/null 科特迪瓦/ns/ke te di wa/null 加纳/ns/jia na/null 多哥/ns/duo ge/null 贝宁/ns/bei ning/null 尼日尔/ns/ni ri er/null 加那利群岛/ns/jia na li qun dao/null 赞比亚/ns/zan bi ya/null 安哥拉/ns/an ge la/null 津巴布韦/ns/jin ba bu wei/null 马拉维/ns/ma la wei/null 莫桑比克/ns/mo sang bi ke/null 博茨瓦纳/ns/bo ci wa na/null 纳米比亚/ns/na mi bi ya/null 斯威士兰/ns/si wei shi lan/null 莱索托/ns/lai suo tuo/null 马达加斯加/ns/ma da jia si jia/null 科摩罗/ns/ke mo luo/null 毛里求斯/ns/mao li qiu si/null 留尼旺/ns/liu ni wang/null 圣赫勒拿/ns/sheng he lei na/null 澳大利亚/ns/ao da li ya/null 新西兰/ns/xin xi lan/null 巴布亚新几内亚/ns/ba bu ya xin ji nei ya/null 所罗门群岛/ns/suo luo men qun dao/null 瓦努阿图/ns/wa nu a tu/null 密克罗尼西亚/ns/mi ke luo ni xi ya/null 马绍尔群岛/ns/ma shao er qun dao/null 帕劳/ns/pa lao/null 瑙鲁/ns/nao lu/null 基里巴斯/ns/ji li ba si/null 图瓦卢/ns/tu wa lu/null 萨摩亚/ns/sa mo ya/null 斐济群岛/ns/fei ji qun dao/null 汤加/ns/tang jia/null 库克群岛/ns/ku ke qun dao/null 关岛/ns/guan dao/null 新喀里多尼亚/ns/xin ka li duo ni ya/null 法属波利尼西亚/ns/fa shu bo li ni xi ya/null 皮特凯恩岛/ns/pi te kai en dao/null 瓦利斯与富图纳/ns/wa li si yu fu tu na/null 纽埃/ns/niu ai/null 托克劳/ns/tuo ke lao/null 美属萨摩亚/ns/mei shu sa mo ya/null 北马里亚纳/ns/bei ma li ya na/null 格陵兰 /ns/ge ling lan/null 危地马拉/ns/wei di ma la/null 伯利兹/ns/bo li zi/null 萨尔瓦多/ns/sa er wa duo/null 洪都拉斯/ns/hong du la si/null 尼加拉瓜/ns/ni jia la gua/null 哥斯达黎加/ns/ge si da li jia/null 巴拿马/ns/ba na ma/null 巴哈马/ns/ba ha ma/null 牙买加/ns/ya mai jia/null 海地/ns/hai di/null 多米尼加共和国/ns/duo mi ni jia gong he guo/null 安提瓜和巴布达/ns/an ti gua he ba bu da/null 圣基茨和尼维斯/ns/sheng ji ci he ni wei si/null 多米尼克/ns/duo mi ni ke/null 圣卢西亚/ns/sheng lu xi ya/null 圣文森特和格林纳丁斯/ns/ya wen sen te he ge lin na ding si/null 格林纳达/ns/ge lin na da/null 巴巴多斯/ns/ba ba duo si/null 特立尼达和多巴哥/ns/te li ni da he duo ba ge/null 波多黎各/ns/bo duo li ge/null 英属维尔京群岛/ns/ying shu wei er jing qun dao/null 美属维尔京群岛/ns/mei shu wei er jing qun dao/null 安圭拉/ns/an gui la/null 蒙特塞拉特/ns/meng te sai la te/null 瓜德罗普/ns/gua de luo pu/null 马提尼克/ns/ma ti ni ke/null 荷属安的列斯/ns/he shu an di lie si/null 阿鲁巴/ns/a lu ba/null 特克斯和凯科斯群岛/ns/te ke si he kai ke si qun dao/null 开曼群岛/ns/kai man qun dao/null 百慕大/ns/bai mu da/null 哥伦比亚/ns/ge lun bi ya/null 委内瑞拉/ns/wei nei rui la/null 圭亚那/ns/gui ya na/null 法属圭亚那/ns/fa shu gui ya na/null 苏里南 /ns/su li nan/null 厄瓜多尔/ns/e gua duo er/null 秘鲁/ns/bi lu/null 玻利维亚/ns/bo li wei ya/null 巴西/ns/ba xi/null 智利/ns/zhi li/null 阿根廷/ns/a gen ting/null 乌拉圭/ns/wu la gui/null 巴拉圭/ns/ba la gui/null
Lex
3
passerbya/jcseg
vendors/lexicon/lex-nation.lex
[ "Apache-2.0" ]
# <API name> <API description> # Data Structures ## User (object) Description of User going there ### Properties - name (string) - address (object) - street (object) - name (string) - house number (number) - city (string) - zip (number) ### Properties - id (number) - hobby: sex, drugs, rock'n'roll (array)
API Blueprint
3
darkcl/drafter
test/fixtures/mson/typed-object.apib
[ "MIT" ]
(set-info :smt-lib-version 2.6) (set-logic QF_UF) (set-info :source | Generated by: Aman Goel ([email protected]), Karem A. Sakallah ([email protected]) Generated on: 2018-04-06 Generated by the tool Averroes 2 (successor of [1]) which implements safety property verification on hardware systems. This SMT problem belongs to a set of SMT problems generated by applying Averroes 2 to benchmarks derived from [2-5]. A total of 412 systems (345 from [2], 19 from [3], 26 from [4], 22 from [5]) were syntactically converted from their original formats (using [6, 7]), and given to Averroes 2 to perform property checking with abstraction (wide bit-vectors -> terms, wide operators -> UF) using SMT solvers [8, 9]. [1] Lee S., Sakallah K.A. (2014) Unbounded Scalable Verification Based on Approximate Property-Directed Reachability and Datapath Abstraction. In: Biere A., Bloem R. (eds) Computer Aided Verification. CAV 2014. Lecture Notes in Computer Science, vol 8559. Springer, Cham [2] http://fmv.jku.at/aiger/index.html#beem [3] http://www.cs.cmu.edu/~modelcheck/vcegar [4] http://www.cprover.org/hardware/v2c [5] http://github.com/aman-goel/verilogbench [6] http://www.clifford.at/yosys [7] http://github.com/chengyinwu/V3 [8] http://github.com/Z3Prover/z3 [9] http://github.com/SRI-CSL/yices2 id: blocks.2.prop1 query-maker: "Yices 2" query-time: 0.001000 ms query-class: abstract query-category: oneshot query-type: regular status: unsat |) (set-info :license "https://creativecommons.org/licenses/by/4.0/") (set-info :category "industrial") ; (set-info :status unsat) (declare-sort utt$8 0) (declare-fun y$1 () Bool) (declare-fun y$10 () Bool) (declare-fun y$12 () Bool) (declare-fun y$1244 () Bool) (declare-fun y$1245 () Bool) (declare-fun y$1272 () Bool) (declare-fun y$1279 () Bool) (declare-fun y$14 () Bool) (declare-fun y$16 () Bool) (declare-fun y$18 () Bool) (declare-fun y$20 () Bool) (declare-fun y$22 () Bool) (declare-fun y$24 () Bool) (declare-fun y$26 () Bool) (declare-fun y$28 () Bool) (declare-fun y$3 () Bool) (declare-fun y$30 () Bool) (declare-fun y$32 () Bool) (declare-fun y$34 () Bool) (declare-fun y$5 () Bool) (declare-fun y$7 () Bool) (declare-fun y$a_done () Bool) (declare-fun y$a_emptyhand () Bool) (declare-fun y$a_fullhand () Bool) (declare-fun y$dve_invalid () Bool) (declare-fun y$id19 () Bool) (declare-fun y$id19_op () Bool) (declare-fun y$n0s8 () utt$8) (declare-fun y$n1s8 () utt$8) (declare-fun y$n253s8 () utt$8) (declare-fun y$n254s8 () utt$8) (declare-fun y$n255s8 () utt$8) (declare-fun y$n2s8 () utt$8) (declare-fun y$n3s8 () utt$8) (declare-fun y$n4s8 () utt$8) (declare-fun y$n5s8 () utt$8) (declare-fun y$prop () Bool) (declare-fun y$v_clear_0 () utt$8) (declare-fun y$v_clear_1 () utt$8) (declare-fun y$v_clear_2 () utt$8) (declare-fun y$v_clear_3 () utt$8) (declare-fun y$v_clear_4 () utt$8) (declare-fun y$v_clear_5 () utt$8) (declare-fun y$v_holding () utt$8) (declare-fun y$v_on_0 () utt$8) (declare-fun y$v_on_1 () utt$8) (declare-fun y$v_on_2 () utt$8) (declare-fun y$v_on_3 () utt$8) (declare-fun y$v_on_4 () utt$8) (declare-fun y$v_on_5 () utt$8) (assert (distinct y$n0s8 y$n2s8 y$n253s8 y$n254s8 y$n5s8 y$n4s8 y$n3s8 y$n1s8 y$n255s8)) (assert (= y$a_done (not y$1))) (assert (= y$a_emptyhand (not y$3))) (assert (= y$a_fullhand (not y$5))) (assert (= y$dve_invalid (not y$7))) (assert (= y$10 (= y$n0s8 y$v_clear_0))) (assert (= y$12 (= y$n0s8 y$v_clear_1))) (assert (= y$14 (= y$n0s8 y$v_clear_2))) (assert (= y$16 (= y$n0s8 y$v_clear_3))) (assert (= y$18 (= y$n0s8 y$v_clear_4))) (assert (= y$20 (= y$n0s8 y$v_clear_5))) (assert (= y$22 (= y$n0s8 y$v_holding))) (assert (= y$24 (= y$n0s8 y$v_on_0))) (assert (= y$26 (= y$n0s8 y$v_on_1))) (assert (= y$28 (= y$n0s8 y$v_on_2))) (assert (= y$30 (= y$n0s8 y$v_on_3))) (assert (= y$32 (= y$n0s8 y$v_on_4))) (assert (= y$34 (= y$n0s8 y$v_on_5))) (assert (= y$prop (not y$1272))) (assert (= y$id19_op (and y$a_done y$7))) (assert (= y$id19_op (not y$1244))) (assert (= y$1245 (= y$prop y$1244))) (assert (= y$1279 (and y$1 y$3 y$5 y$7 y$10 y$12 y$14 y$16 y$18 y$20 y$22 y$24 y$26 y$28 y$30 y$32 y$34 y$1272 y$1245))) (assert y$1279) (check-sat) (exit)
SMT
3
livinlife6751/infer
sledge/test/smt/QF_UF/2018-Goel-hwbench/QF_UF_blocks.2.prop1_ab_reg_max.smt2
[ "MIT" ]
# no module name: this is an anonymous module function getMain = |args...| { println("getMain called") return DynamicObject() : define("roll", |this| { this: publish("hello", JSON.stringify(DynamicObject() : colorIndex(this: rnd(0,5)) : speed(this: rnd(0,110)) : direction(this: rnd(0,360)) ) ) }) # end of roll }
Golo
3
TypeUnsafe/golo-tour
08-golo.37.ToursJUG/11-dynamic/sphero/with-golo/abilities/main.golo
[ "MIT" ]
/*++ Copyright (c) Microsoft Corporation. Licensed under the MIT license. Module Name: - unicode.hpp Abstract: - This file contains global vars for some common wchar values. - taken from input.h Author(s): - Austin Diviness (AustDi) Oct 2017 --*/ #pragma once #define CP_UTF8 65001 #define CP_USA 437 #define CP_KOREAN 949 #define CP_JAPANESE 932 #define CP_CHINESE_SIMPLIFIED 936 #define CP_CHINESE_TRADITIONAL 950 #define IsBilingualCP(cp) ((cp) == CP_JAPANESE || (cp) == CP_KOREAN) #define IsEastAsianCP(cp) ((cp) == CP_JAPANESE || (cp) == CP_KOREAN || (cp) == CP_CHINESE_TRADITIONAL || (cp) == CP_CHINESE_SIMPLIFIED) // UNICODE_NULL is a Windows macro definition constexpr wchar_t UNICODE_BACKSPACE = 0x8; constexpr wchar_t UNICODE_ESC = 0x1b; constexpr wchar_t UNICODE_DEL = 0x7f; // NOTE: This isn't actually a backspace. It's a graphical block. But // I believe it's emitted by one of our ANSI/OEM --> Unicode conversions. // We should dig further into this in the future. constexpr wchar_t UNICODE_BACKSPACE2 = 0x25d8; constexpr wchar_t UNICODE_CARRIAGERETURN = 0x0d; constexpr wchar_t UNICODE_LINEFEED = 0x0a; constexpr wchar_t UNICODE_BELL = 0x07; constexpr wchar_t UNICODE_TAB = 0x09; constexpr wchar_t UNICODE_SPACE = 0x20; constexpr wchar_t UNICODE_LEFT_SMARTQUOTE = 0x201c; constexpr wchar_t UNICODE_RIGHT_SMARTQUOTE = 0x201d; constexpr wchar_t UNICODE_EM_DASH = 0x2014; constexpr wchar_t UNICODE_EN_DASH = 0x2013; constexpr wchar_t UNICODE_NBSP = 0xa0; constexpr wchar_t UNICODE_NARROW_NBSP = 0x202f; constexpr wchar_t UNICODE_QUOTE = L'\"'; constexpr wchar_t UNICODE_HYPHEN = L'-'; constexpr wchar_t UNICODE_BOX_DRAW_LIGHT_DOWN_AND_RIGHT = 0x250c; constexpr wchar_t UNICODE_BOX_DRAW_LIGHT_DOWN_AND_LEFT = 0x2510; constexpr wchar_t UNICODE_BOX_DRAW_LIGHT_HORIZONTAL = 0x2500; constexpr wchar_t UNICODE_BOX_DRAW_LIGHT_VERTICAL = 0x2502; constexpr wchar_t UNICODE_BOX_DRAW_LIGHT_UP_AND_RIGHT = 0x2514; constexpr wchar_t UNICODE_BOX_DRAW_LIGHT_UP_AND_LEFT = 0x2518; constexpr wchar_t UNICODE_INVALID = 0xFFFF; // This is the "Ctrl+C" character. // With VKey='C', it generates a CTRL_C_EVENT // With VKey=VK_CANCEL (0x3), it generates a CTRL_BREAK_EVENT constexpr wchar_t UNICODE_ETX = L'\x3'; constexpr wchar_t UNICODE_REPLACEMENT = 0xFFFD;
C++
4
hessedoneen/terminal
src/inc/unicode.hpp
[ "MIT" ]
library ieee; use ieee.std_logic_unsigned.all; use ieee.std_logic_1164.all; use ieee.numeric_std.all; entity top_testbench is --test generic ( -- test n : integer := 8 -- test ); -- test end top_testbench; -- test architecture top_testbench_arch of top_testbench is component top is generic ( n : integer ) ; port ( clk : in std_logic; rst : in std_logic; d1 : in std_logic_vector (n-1 downto 0); d2 : in std_logic_vector (n-1 downto 0); operation : in std_logic; result : out std_logic_vector (2*n-1 downto 0) ); end component; signal clk : std_logic; signal rst : std_logic; signal operation : std_logic; signal d1 : std_logic_vector (n-1 downto 0); signal d2 : std_logic_vector (n-1 downto 0); signal result : std_logic_vector (2*n-1 downto 0); type test_type is ( a1, a2, a3, a4, a5, a6, a7, a8, a9, a10); attribute enum_encoding of my_state : type is "001 010 011 100 111"; begin TESTUNIT : top generic map (n => n) port map (clk => clk, rst => rst, d1 => d1, d2 => d2, operation => operation, result => result); clock_process : process begin clk <= '0'; wait for 5 ns; clk <= '1'; wait for 5 ns; end process; data_process : process begin -- test case #1 operation <= '0'; rst <= '1'; wait for 5 ns; rst <= '0'; wait for 5 ns; d1 <= std_logic_vector(to_unsigned(60, d1'length)); d2 <= std_logic_vector(to_unsigned(12, d2'length)); wait for 360 ns; assert (result = std_logic_vector(to_unsigned(720, result'length))) report "Test case #1 failed" severity error; -- test case #2 operation <= '0'; rst <= '1'; wait for 5 ns; rst <= '0'; wait for 5 ns; d1 <= std_logic_vector(to_unsigned(55, d1'length)); d2 <= std_logic_vector(to_unsigned(1, d2'length)); wait for 360 ns; assert (result = std_logic_vector(to_unsigned(55, result'length))) report "Test case #2 failed" severity error; -- etc end process; end top_testbench_arch; configuration testbench_for_top of top_testbench is for top_testbench_arch for TESTUNIT : top use entity work.top(top_arch); end for; end for; end testbench_for_top; function compare(A: std_logic, B: std_Logic) return std_logic is constant pi : real := 3.14159; constant half_pi : real := pi / 2.0; constant cycle_time : time := 2 ns; constant N, N5 : integer := 5; begin if (A = '0' and B = '1') then return B; else return A; end if ; end compare; procedure print(P : std_logic_vector(7 downto 0); U : std_logic_vector(3 downto 0)) is variable my_line : line; alias swrite is write [line, string, side, width] ; begin swrite(my_line, "sqrt( "); write(my_line, P); swrite(my_line, " )= "); write(my_line, U); writeline(output, my_line); end print; entity add32csa is -- one stage of carry save adder for multiplier port( b : in std_logic; -- a multiplier bit a : in std_logic_vector(31 downto 0); -- multiplicand sum_in : in std_logic_vector(31 downto 0); -- sums from previous stage cin : in std_logic_vector(31 downto 0); -- carrys from previous stage sum_out : out std_logic_vector(31 downto 0); -- sums to next stage cout : out std_logic_vector(31 downto 0)); -- carrys to next stage end add32csa; ARCHITECTURE circuits of add32csa IS SIGNAL zero : STD_LOGIC_VECTOR(31 downto 0) := X"00000000"; SIGNAL aa : std_logic_vector(31 downto 0) := X"00000000"; COMPONENT fadd -- duplicates entity port PoRT(a : in std_logic; b : in std_logic; cin : in std_logic; s : out std_logic; cout : out std_logic); end comPonent fadd; begin -- circuits of add32csa aa <= a when b='1' else zero after 1 ns; stage: for I in 0 to 31 generate sta: fadd port map(aa(I), sum_in(I), cin(I) , sum_out(I), cout(I)); end generate stage; end architecture circuits; -- of add32csa
VHDL
4
btashton/pygments
tests/examplefiles/test.vhdl
[ "BSD-2-Clause" ]
<?xml version="1.0" encoding="UTF-8"?> <!-- generated with COPASI 4.27 (Build 217) (http://www.copasi.org) at 2020-03-29T14:05:46Z --> <?oxygen RNGSchema="http://www.copasi.org/static/schema/CopasiML.rng" type="xml"?> <COPASI xmlns="http://www.copasi.org/static/schema" versionMajor="4" versionMinor="27" versionDevel="217" copasiSourcesModified="0"> <ListOfFunctions> <Function key="Function_13" name="Mass action (irreversible)" type="MassAction" reversible="false"> <MiriamAnnotation> <rdf:RDF xmlns:CopasiMT="http://www.copasi.org/RDF/MiriamTerms#" xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Function_13"> <CopasiMT:is rdf:resource="urn:miriam:obo.sbo:SBO:0000163" /> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Comment> <body xmlns="http://www.w3.org/1999/xhtml"> <b>Mass action rate law for irreversible reactions</b> <p> Reaction scheme where the products are created from the reactants and the change of a product quantity is proportional to the product of reactant activities. The reaction scheme does not include any reverse process that creates the reactants from the products. The change of a product quantity is proportional to the quantity of one reactant. </p> </body> </Comment> <Expression> k1*PRODUCT&lt;substrate_i> </Expression> <ListOfParameterDescriptions> <ParameterDescription key="FunctionParameter_80" name="k1" order="0" role="constant"/> <ParameterDescription key="FunctionParameter_81" name="substrate" order="1" role="substrate"/> </ListOfParameterDescriptions> </Function> </ListOfFunctions> <Model key="Model_1" name="COVID-19 SEIR" simulationType="time" timeUnit="d" volumeUnit="l" areaUnit="m²" lengthUnit="m" quantityUnit="#" type="deterministic" avogadroConstant="6.0221408570000002e+23"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#" xmlns:vCard="http://www.w3.org/2001/vcard-rdf/3.0#"> <rdf:Description rdf:about="#Model_1"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T12:05:07Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> <dcterms:creator> <rdf:Description> <vCard:EMAIL>[email protected]</vCard:EMAIL> <vCard:N> <rdf:Description> <vCard:Family>Hill</vCard:Family> <vCard:Given>Alison</vCard:Given> </rdf:Description> </vCard:N> <vCard:ORG> <rdf:Description> <vCard:Orgname>Harvard University</vCard:Orgname> </rdf:Description> </vCard:ORG> </rdf:Description> </dcterms:creator> <dcterms:creator> <rdf:Description> <vCard:EMAIL>[email protected]</vCard:EMAIL> <vCard:N> <rdf:Description> <vCard:Family>Mendes</vCard:Family> <vCard:Given>Pedro</vCard:Given> </rdf:Description> </vCard:N> <vCard:ORG> <rdf:Description> <vCard:Orgname>University of Connecticut</vCard:Orgname> </rdf:Description> </vCard:ORG> </rdf:Description> </dcterms:creator> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Comment> <body xmlns="http://www.w3.org/1999/xhtml"><h1>COVID-19 SEIR model</h1> <p>This model is a basic SEIR model.</p> <p>The model can be run in the traditional mode, by using and solving ODEs, or in a stochastic mode, by using the Gillespie stochastic simulation algorithm.</p> <p>This is based on the model published by <a href="https://alhill.shinyapps.io/COVID19seir/">Alison Hill</a> with code on <a href="https://github.com/alsnhll/SEIR_COVID19">GitHub</a></p> <p>This model is published under the <a href="https://creativecommons.org/licenses/by-sa/4.0/">CC-BY-SA 4.0 International license</a></p></body> </Comment> <ListOfCompartments> <Compartment key="Compartment_0" name="compartment" simulationType="fixed" dimensionality="3" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Compartment_0"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:21:05Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </Compartment> </ListOfCompartments> <ListOfMetabolites> <Metabolite key="Metabolite_0" name="E" simulationType="reactions" compartment="Compartment_0" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Metabolite_0"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:21:05Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </Metabolite> <Metabolite key="Metabolite_1" name="I1" simulationType="reactions" compartment="Compartment_0" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Metabolite_0"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:21:05Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </Metabolite> <Metabolite key="Metabolite_2" name="S" simulationType="reactions" compartment="Compartment_0" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Metabolite_0"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:21:05Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </Metabolite> <Metabolite key="Metabolite_3" name="I2" simulationType="reactions" compartment="Compartment_0" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Metabolite_3"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:21:23Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </Metabolite> <Metabolite key="Metabolite_4" name="I3" simulationType="reactions" compartment="Compartment_0" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Metabolite_4"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:21:48Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </Metabolite> <Metabolite key="Metabolite_5" name="D" simulationType="reactions" compartment="Compartment_0" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Metabolite_5"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:24:02Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </Metabolite> <Metabolite key="Metabolite_6" name="R" simulationType="reactions" compartment="Compartment_0" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Metabolite_6"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:24:20Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </Metabolite> </ListOfMetabolites> <ListOfModelValues> <ModelValue key="ModelValue_0" name="beta1" simulationType="assignment" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_0"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:03Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta1_base],Reference=InitialValue>/&lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[N],Reference=InitialValue> </Expression> </ModelValue> <ModelValue key="ModelValue_1" name="beta2" simulationType="assignment" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_1"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:05Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta2_base],Reference=InitialValue>/&lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[N],Reference=InitialValue> </Expression> </ModelValue> <ModelValue key="ModelValue_2" name="beta3" simulationType="assignment" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_2"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:07Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta3_base],Reference=InitialValue>/&lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[N],Reference=InitialValue> </Expression> </ModelValue> <ModelValue key="ModelValue_3" name="alpha" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_3"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:09Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_4" name="gamma1" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_4"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:15Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_5" name="gamma2" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_5"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:25Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_6" name="gamma3" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_6"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:28Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_7" name="p1" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_7"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:45Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_8" name="p2" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_8"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:34:46Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_9" name="miu" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_9"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:35:04Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_10" name="N" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_10"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:35:48Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[S],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[E],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[R],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[D],Reference=InitialParticleNumber> </InitialExpression> </ModelValue> <ModelValue key="ModelValue_11" name="Itot" simulationType="assignment" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_11"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T19:03:19Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1],Reference=ParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3],Reference=ParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2],Reference=ParticleNumber> </Expression> </ModelValue> <ModelValue key="ModelValue_12" name="Hosp" simulationType="assignment" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_12"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T19:03:19Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3],Reference=ParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2],Reference=ParticleNumber> </Expression> </ModelValue> <ModelValue key="ModelValue_13" name="beta1_base" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_13"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-23T21:38:36Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_14" name="beta2_base" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_14"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-23T21:38:41Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> <ModelValue key="ModelValue_15" name="beta3_base" simulationType="fixed" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelValue_15"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-23T21:38:44Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> </ModelValue> </ListOfModelValues> <ListOfReactions> <Reaction key="Reaction_0" name="Infection1" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_0"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:20:31Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_2" stoichiometry="1"/> <Substrate metabolite="Metabolite_1" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_0" stoichiometry="1"/> <Product metabolite="Metabolite_1" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_5001" name="k1" value="9.2368e-08"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_0"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_2"/> <SourceParameter reference="Metabolite_1"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_1" name="Infection2" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_1"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:21:05Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_2" stoichiometry="1"/> <Substrate metabolite="Metabolite_3" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_0" stoichiometry="1"/> <Product metabolite="Metabolite_3" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_5000" name="k1" value="0"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_1"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_2"/> <SourceParameter reference="Metabolite_3"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_2" name="Infection3" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_2"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:21:33Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_2" stoichiometry="1"/> <Substrate metabolite="Metabolite_4" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_0" stoichiometry="1"/> <Product metabolite="Metabolite_4" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_4999" name="k1" value="0"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_2"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_2"/> <SourceParameter reference="Metabolite_4"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_3" name="Onset" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_3"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:22:29Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_0" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_1" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_4998" name="k1" value="0.2"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_3"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_0"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_4" name="Progression1" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_4"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:22:56Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_1" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_3" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_4997" name="k1" value="0.033"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_7"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_1"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_5" name="Progression2" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_5"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:23:15Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_3" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_4" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_4996" name="k1" value="0.062"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_8"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_3"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_6" name="Death" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_6"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:23:46Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_4" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_5" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_4995" name="k1" value="0.04"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_9"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_4"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_7" name="Recovery1" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_7"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:24:05Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_1" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_6" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_4994" name="k1" value="0.133"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_4"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_1"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_8" name="Recovery2" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_8"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:24:23Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_3" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_6" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_4993" name="k1" value="0.188"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_5"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_3"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> <Reaction key="Reaction_9" name="Recovery3" reversible="false" fast="false" addNoise="false"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Reaction_9"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T18:24:34Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ListOfSubstrates> <Substrate metabolite="Metabolite_4" stoichiometry="1"/> </ListOfSubstrates> <ListOfProducts> <Product metabolite="Metabolite_6" stoichiometry="1"/> </ListOfProducts> <ListOfConstants> <Constant key="Parameter_4992" name="k1" value="0.06"/> </ListOfConstants> <KineticLaw function="Function_13" unitType="Default" scalingCompartment="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]"> <ListOfCallParameters> <CallParameter functionParameter="FunctionParameter_80"> <SourceParameter reference="ModelValue_6"/> </CallParameter> <CallParameter functionParameter="FunctionParameter_81"> <SourceParameter reference="Metabolite_4"/> </CallParameter> </ListOfCallParameters> </KineticLaw> </Reaction> </ListOfReactions> <ListOfModelParameterSets activeSet="ModelParameterSet_1"> <ModelParameterSet key="ModelParameterSet_1" name="Initial State"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelParameterSet_1"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-29T14:04:14Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ModelParameterGroup cn="String=Initial Time" type="Group"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR" value="0" type="Model" simulationType="time"/> </ModelParameterGroup> <ModelParameterGroup cn="String=Initial Compartment Sizes" type="Group"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]" value="1" type="Compartment" simulationType="fixed"/> </ModelParameterGroup> <ModelParameterGroup cn="String=Initial Species Values" type="Group"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[E]" value="0" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1]" value="1" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[S]" value="3572664" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2]" value="0" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3]" value="0" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[D]" value="0" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[R]" value="0" type="Species" simulationType="reactions"/> </ModelParameterGroup> <ModelParameterGroup cn="String=Initial Global Quantities" type="Group"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta1]" value="9.2368022190717578e-08" type="ModelValue" simulationType="assignment"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta2]" value="0" type="ModelValue" simulationType="assignment"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta3]" value="0" type="ModelValue" simulationType="assignment"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[alpha]" value="0.20000000000000001" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma1]" value="0.13300000000000001" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma2]" value="0.188" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma3]" value="0.059999999999999998" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[p1]" value="0.033000000000000002" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[p2]" value="0.062" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[miu]" value="0.040000000000000001" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[N]" value="3572665" type="ModelValue" simulationType="fixed"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[S],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[E],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[R],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[D],Reference=InitialParticleNumber> </InitialExpression> </ModelParameter> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[Itot]" value="1" type="ModelValue" simulationType="assignment"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[Hosp]" value="0" type="ModelValue" simulationType="assignment"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta1_base]" value="0.33000000000000002" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta2_base]" value="0" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta3_base]" value="0" type="ModelValue" simulationType="fixed"/> </ModelParameterGroup> <ModelParameterGroup cn="String=Kinetic Parameters" type="Group"> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection1]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection1],ParameterGroup=Parameters,Parameter=k1" value="9.2368022190717578e-08" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta1],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection2]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection2],ParameterGroup=Parameters,Parameter=k1" value="0" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta2],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection3]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection3],ParameterGroup=Parameters,Parameter=k1" value="0" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta3],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Onset]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Onset],ParameterGroup=Parameters,Parameter=k1" value="0.20000000000000001" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[alpha],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Progression1]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Progression1],ParameterGroup=Parameters,Parameter=k1" value="0.033000000000000002" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[p1],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Progression2]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Progression2],ParameterGroup=Parameters,Parameter=k1" value="0.062" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[p2],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Death]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Death],ParameterGroup=Parameters,Parameter=k1" value="0.040000000000000001" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[miu],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery1]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery1],ParameterGroup=Parameters,Parameter=k1" value="0.13300000000000001" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma1],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery2]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery2],ParameterGroup=Parameters,Parameter=k1" value="0.188" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma2],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery3]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery3],ParameterGroup=Parameters,Parameter=k1" value="0.059999999999999998" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma3],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> </ModelParameterGroup> </ModelParameterSet> <ModelParameterSet key="ModelParameterSet_3" name="Alison Hill initial parameter set"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#ModelParameterSet_3"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-22T12:05:07Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <ModelParameterGroup cn="String=Initial Time" type="Group"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR" value="0" type="Model" simulationType="time"/> </ModelParameterGroup> <ModelParameterGroup cn="String=Initial Compartment Sizes" type="Group"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment]" value="1" type="Compartment" simulationType="fixed"/> </ModelParameterGroup> <ModelParameterGroup cn="String=Initial Species Values" type="Group"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[E]" value="0" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1]" value="1" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[S]" value="999" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2]" value="0" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3]" value="0" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[D]" value="0" type="Species" simulationType="reactions"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[R]" value="0" type="Species" simulationType="reactions"/> </ModelParameterGroup> <ModelParameterGroup cn="String=Initial Global Quantities" type="Group"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta1]" value="0.00033" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta2]" value="0" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[beta3]" value="0" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[alpha]" value="0.20000000000000001" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma1]" value="0.13300000000000001" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma2]" value="0.188" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma3]" value="0.059999999999999998" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[p1]" value="0.033000000000000002" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[p2]" value="0.062" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[miu]" value="0.040000000000000001" type="ModelValue" simulationType="fixed"/> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[N]" value="1000" type="ModelValue" simulationType="fixed"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[S],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[E],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[R],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[D],Reference=InitialParticleNumber> </InitialExpression> </ModelParameter> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[N (moles)]" value="1000" type="ModelValue" simulationType="fixed"> <InitialExpression> (&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[S],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[E],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[R],Reference=InitialParticleNumber>+&lt;CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[D],Reference=InitialParticleNumber>)/&lt;CN=Root,Model=COVID-19 SEIR,Reference=Quantity Conversion Factor> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="String=Kinetic Parameters" type="Group"> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection1]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection1],ParameterGroup=Parameters,Parameter=k1" value="0.00033" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta1],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection2]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection2],ParameterGroup=Parameters,Parameter=k1" value="0" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta2],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection3]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Infection3],ParameterGroup=Parameters,Parameter=k1" value="0" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[beta3],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Onset]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Onset],ParameterGroup=Parameters,Parameter=k1" value="0.20000000000000001" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[alpha],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Progression1]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Progression1],ParameterGroup=Parameters,Parameter=k1" value="0.033000000000000002" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[p1],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Progression2]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Progression2],ParameterGroup=Parameters,Parameter=k1" value="0.062" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[p2],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Death]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Death],ParameterGroup=Parameters,Parameter=k1" value="0.040000000000000001" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[miu],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery1]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery1],ParameterGroup=Parameters,Parameter=k1" value="0.13300000000000001" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma1],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery2]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery2],ParameterGroup=Parameters,Parameter=k1" value="0.188" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma2],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> <ModelParameterGroup cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery3]" type="Reaction"> <ModelParameter cn="CN=Root,Model=COVID-19 SEIR,Vector=Reactions[Recovery3],ParameterGroup=Parameters,Parameter=k1" value="0.059999999999999998" type="ReactionParameter" simulationType="assignment"> <InitialExpression> &lt;CN=Root,Model=COVID-19 SEIR,Vector=Values[gamma3],Reference=InitialValue> </InitialExpression> </ModelParameter> </ModelParameterGroup> </ModelParameterGroup> </ModelParameterSet> </ListOfModelParameterSets> <StateTemplate> <StateTemplateVariable objectReference="Model_1"/> <StateTemplateVariable objectReference="Metabolite_0"/> <StateTemplateVariable objectReference="Metabolite_3"/> <StateTemplateVariable objectReference="Metabolite_4"/> <StateTemplateVariable objectReference="Metabolite_1"/> <StateTemplateVariable objectReference="Metabolite_6"/> <StateTemplateVariable objectReference="Metabolite_5"/> <StateTemplateVariable objectReference="Metabolite_2"/> <StateTemplateVariable objectReference="ModelValue_0"/> <StateTemplateVariable objectReference="ModelValue_1"/> <StateTemplateVariable objectReference="ModelValue_2"/> <StateTemplateVariable objectReference="ModelValue_11"/> <StateTemplateVariable objectReference="ModelValue_12"/> <StateTemplateVariable objectReference="Compartment_0"/> <StateTemplateVariable objectReference="ModelValue_3"/> <StateTemplateVariable objectReference="ModelValue_4"/> <StateTemplateVariable objectReference="ModelValue_5"/> <StateTemplateVariable objectReference="ModelValue_6"/> <StateTemplateVariable objectReference="ModelValue_7"/> <StateTemplateVariable objectReference="ModelValue_8"/> <StateTemplateVariable objectReference="ModelValue_9"/> <StateTemplateVariable objectReference="ModelValue_10"/> <StateTemplateVariable objectReference="ModelValue_13"/> <StateTemplateVariable objectReference="ModelValue_14"/> <StateTemplateVariable objectReference="ModelValue_15"/> </StateTemplate> <InitialState type="initialState"> 0 0 0 0 1 0 0 3572664 9.2368022190717578e-08 0 0 1 0 1 0.20000000000000001 0.13300000000000001 0.188 0.059999999999999998 0.033000000000000002 0.062 0.040000000000000001 3572665 0.33000000000000002 0 0 </InitialState> </Model> <ListOfTasks> <Task key="Task_15" name="Steady-State" type="steadyState" scheduled="false" updateModel="false"> <Report reference="Report_10" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="JacobianRequested" type="bool" value="1"/> <Parameter name="StabilityAnalysisRequested" type="bool" value="1"/> </Problem> <Method name="Enhanced Newton" type="EnhancedNewton"> <Parameter name="Resolution" type="unsignedFloat" value="1.0000000000000001e-09"/> <Parameter name="Derivation Factor" type="unsignedFloat" value="0.001"/> <Parameter name="Use Newton" type="bool" value="1"/> <Parameter name="Use Integration" type="bool" value="1"/> <Parameter name="Use Back Integration" type="bool" value="0"/> <Parameter name="Accept Negative Concentrations" type="bool" value="0"/> <Parameter name="Iteration Limit" type="unsignedInteger" value="50"/> <Parameter name="Maximum duration for forward integration" type="unsignedFloat" value="1000000000"/> <Parameter name="Maximum duration for backward integration" type="unsignedFloat" value="1000000"/> <Parameter name="Target Criterion" type="string" value="Distance and Rate"/> </Method> </Task> <Task key="Task_16" name="Time-Course" type="timeCourse" scheduled="false" updateModel="false"> <Report reference="Report_11" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="AutomaticStepSize" type="bool" value="1"/> <Parameter name="StepNumber" type="unsignedInteger" value="50"/> <Parameter name="StepSize" type="float" value="1.2"/> <Parameter name="Duration" type="float" value="60"/> <Parameter name="TimeSeriesRequested" type="bool" value="1"/> <Parameter name="OutputStartTime" type="float" value="0"/> <Parameter name="Output Event" type="bool" value="0"/> <Parameter name="Start in Steady State" type="bool" value="0"/> <Parameter name="Use Values" type="bool" value="0"/> <Parameter name="Values" type="string" value=""/> </Problem> <Method name="Deterministic (LSODA)" type="Deterministic(LSODA)"> <Parameter name="Integrate Reduced Model" type="bool" value="0"/> <Parameter name="Relative Tolerance" type="unsignedFloat" value="9.9999999999999995e-07"/> <Parameter name="Absolute Tolerance" type="unsignedFloat" value="9.9999999999999998e-13"/> <Parameter name="Max Internal Steps" type="unsignedInteger" value="100000"/> <Parameter name="Max Internal Step Size" type="unsignedFloat" value="0"/> </Method> </Task> <Task key="Task_17" name="Scan" type="scan" scheduled="false" updateModel="false"> <Problem> <Parameter name="Subtask" type="unsignedInteger" value="1"/> <ParameterGroup name="ScanItems"> <ParameterGroup name="ScanItem"> <Parameter name="Number of steps" type="unsignedInteger" value="500"/> <Parameter name="Type" type="unsignedInteger" value="0"/> <Parameter name="Object" type="cn" value=""/> </ParameterGroup> </ParameterGroup> <Parameter name="Output in subtask" type="bool" value="1"/> <Parameter name="Adjust initial conditions" type="bool" value="0"/> <Parameter name="Continue on Error" type="bool" value="0"/> </Problem> <Method name="Scan Framework" type="ScanFramework"> </Method> </Task> <Task key="Task_18" name="Elementary Flux Modes" type="fluxMode" scheduled="false" updateModel="false"> <Report reference="Report_12" target="" append="1" confirmOverwrite="1"/> <Problem> </Problem> <Method name="EFM Algorithm" type="EFMAlgorithm"> </Method> </Task> <Task key="Task_19" name="Optimization" type="optimization" scheduled="false" updateModel="false"> <Report reference="Report_13" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="Subtask" type="cn" value="CN=Root,Vector=TaskList[Steady-State]"/> <ParameterText name="ObjectiveExpression" type="expression"> </ParameterText> <Parameter name="Maximize" type="bool" value="0"/> <Parameter name="Randomize Start Values" type="bool" value="0"/> <Parameter name="Calculate Statistics" type="bool" value="1"/> <ParameterGroup name="OptimizationItemList"> </ParameterGroup> <ParameterGroup name="OptimizationConstraintList"> </ParameterGroup> </Problem> <Method name="Random Search" type="RandomSearch"> <Parameter name="Log Verbosity" type="unsignedInteger" value="0"/> <Parameter name="Number of Iterations" type="unsignedInteger" value="100000"/> <Parameter name="Random Number Generator" type="unsignedInteger" value="1"/> <Parameter name="Seed" type="unsignedInteger" value="0"/> </Method> </Task> <Task key="Task_20" name="Parameter Estimation" type="parameterFitting" scheduled="false" updateModel="false"> <Report reference="Report_14" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="Maximize" type="bool" value="0"/> <Parameter name="Randomize Start Values" type="bool" value="0"/> <Parameter name="Calculate Statistics" type="bool" value="1"/> <ParameterGroup name="OptimizationItemList"> </ParameterGroup> <ParameterGroup name="OptimizationConstraintList"> </ParameterGroup> <Parameter name="Steady-State" type="cn" value="CN=Root,Vector=TaskList[Steady-State]"/> <Parameter name="Time-Course" type="cn" value="CN=Root,Vector=TaskList[Time-Course]"/> <Parameter name="Create Parameter Sets" type="bool" value="0"/> <ParameterGroup name="Experiment Set"> </ParameterGroup> <ParameterGroup name="Validation Set"> <Parameter name="Weight" type="unsignedFloat" value="1"/> <Parameter name="Threshold" type="unsignedInteger" value="5"/> </ParameterGroup> </Problem> <Method name="Evolutionary Programming" type="EvolutionaryProgram"> <Parameter name="Log Verbosity" type="unsignedInteger" value="0"/> <Parameter name="Number of Generations" type="unsignedInteger" value="200"/> <Parameter name="Population Size" type="unsignedInteger" value="20"/> <Parameter name="Random Number Generator" type="unsignedInteger" value="1"/> <Parameter name="Seed" type="unsignedInteger" value="0"/> <Parameter name="Stop after # Stalled Generations" type="unsignedInteger" value="0"/> </Method> </Task> <Task key="Task_21" name="Metabolic Control Analysis" type="metabolicControlAnalysis" scheduled="false" updateModel="false"> <Report reference="Report_15" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="Steady-State" type="key" value="Task_15"/> </Problem> <Method name="MCA Method (Reder)" type="MCAMethod(Reder)"> <Parameter name="Modulation Factor" type="unsignedFloat" value="1.0000000000000001e-09"/> <Parameter name="Use Reder" type="bool" value="1"/> <Parameter name="Use Smallbone" type="bool" value="1"/> </Method> </Task> <Task key="Task_22" name="Lyapunov Exponents" type="lyapunovExponents" scheduled="false" updateModel="false"> <Report reference="Report_16" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="ExponentNumber" type="unsignedInteger" value="3"/> <Parameter name="DivergenceRequested" type="bool" value="1"/> <Parameter name="TransientTime" type="float" value="0"/> </Problem> <Method name="Wolf Method" type="WolfMethod"> <Parameter name="Orthonormalization Interval" type="unsignedFloat" value="1"/> <Parameter name="Overall time" type="unsignedFloat" value="1000"/> <Parameter name="Relative Tolerance" type="unsignedFloat" value="9.9999999999999995e-07"/> <Parameter name="Absolute Tolerance" type="unsignedFloat" value="9.9999999999999998e-13"/> <Parameter name="Max Internal Steps" type="unsignedInteger" value="10000"/> </Method> </Task> <Task key="Task_23" name="Time Scale Separation Analysis" type="timeScaleSeparationAnalysis" scheduled="false" updateModel="false"> <Report reference="Report_17" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="StepNumber" type="unsignedInteger" value="100"/> <Parameter name="StepSize" type="float" value="0.01"/> <Parameter name="Duration" type="float" value="1"/> <Parameter name="TimeSeriesRequested" type="bool" value="1"/> <Parameter name="OutputStartTime" type="float" value="0"/> </Problem> <Method name="ILDM (LSODA,Deuflhard)" type="TimeScaleSeparation(ILDM,Deuflhard)"> <Parameter name="Deuflhard Tolerance" type="unsignedFloat" value="0.0001"/> </Method> </Task> <Task key="Task_24" name="Sensitivities" type="sensitivities" scheduled="false" updateModel="false"> <Report reference="Report_18" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="SubtaskType" type="unsignedInteger" value="1"/> <ParameterGroup name="TargetFunctions"> <Parameter name="SingleObject" type="cn" value=""/> <Parameter name="ObjectListType" type="unsignedInteger" value="7"/> </ParameterGroup> <ParameterGroup name="ListOfVariables"> <ParameterGroup name="Variables"> <Parameter name="SingleObject" type="cn" value=""/> <Parameter name="ObjectListType" type="unsignedInteger" value="41"/> </ParameterGroup> <ParameterGroup name="Variables"> <Parameter name="SingleObject" type="cn" value=""/> <Parameter name="ObjectListType" type="unsignedInteger" value="0"/> </ParameterGroup> </ParameterGroup> </Problem> <Method name="Sensitivities Method" type="SensitivitiesMethod"> <Parameter name="Delta factor" type="unsignedFloat" value="0.001"/> <Parameter name="Delta minimum" type="unsignedFloat" value="9.9999999999999998e-13"/> </Method> </Task> <Task key="Task_25" name="Moieties" type="moieties" scheduled="false" updateModel="false"> <Report reference="Report_19" target="" append="1" confirmOverwrite="1"/> <Problem> </Problem> <Method name="Householder Reduction" type="Householder"> </Method> </Task> <Task key="Task_26" name="Cross Section" type="crosssection" scheduled="false" updateModel="false"> <Problem> <Parameter name="AutomaticStepSize" type="bool" value="0"/> <Parameter name="StepNumber" type="unsignedInteger" value="100"/> <Parameter name="StepSize" type="float" value="0.01"/> <Parameter name="Duration" type="float" value="1"/> <Parameter name="TimeSeriesRequested" type="bool" value="1"/> <Parameter name="OutputStartTime" type="float" value="0"/> <Parameter name="Output Event" type="bool" value="0"/> <Parameter name="Start in Steady State" type="bool" value="0"/> <Parameter name="Use Values" type="bool" value="0"/> <Parameter name="Values" type="string" value=""/> <Parameter name="LimitCrossings" type="bool" value="0"/> <Parameter name="NumCrossingsLimit" type="unsignedInteger" value="0"/> <Parameter name="LimitOutTime" type="bool" value="0"/> <Parameter name="LimitOutCrossings" type="bool" value="0"/> <Parameter name="PositiveDirection" type="bool" value="1"/> <Parameter name="NumOutCrossingsLimit" type="unsignedInteger" value="0"/> <Parameter name="LimitUntilConvergence" type="bool" value="0"/> <Parameter name="ConvergenceTolerance" type="float" value="9.9999999999999995e-07"/> <Parameter name="Threshold" type="float" value="0"/> <Parameter name="DelayOutputUntilConvergence" type="bool" value="0"/> <Parameter name="OutputConvergenceTolerance" type="float" value="9.9999999999999995e-07"/> <ParameterText name="TriggerExpression" type="expression"> </ParameterText> <Parameter name="SingleVariable" type="cn" value=""/> </Problem> <Method name="Deterministic (LSODA)" type="Deterministic(LSODA)"> <Parameter name="Integrate Reduced Model" type="bool" value="0"/> <Parameter name="Relative Tolerance" type="unsignedFloat" value="9.9999999999999995e-07"/> <Parameter name="Absolute Tolerance" type="unsignedFloat" value="9.9999999999999998e-13"/> <Parameter name="Max Internal Steps" type="unsignedInteger" value="100000"/> <Parameter name="Max Internal Step Size" type="unsignedFloat" value="0"/> </Method> </Task> <Task key="Task_27" name="Linear Noise Approximation" type="linearNoiseApproximation" scheduled="false" updateModel="false"> <Report reference="Report_20" target="" append="1" confirmOverwrite="1"/> <Problem> <Parameter name="Steady-State" type="key" value="Task_15"/> </Problem> <Method name="Linear Noise Approximation" type="LinearNoiseApproximation"> </Method> </Task> <Task key="Task_28" name="Time-Course Sensitivities" type="timeSensitivities" scheduled="false" updateModel="false"> <Problem> <Parameter name="AutomaticStepSize" type="bool" value="0"/> <Parameter name="StepNumber" type="unsignedInteger" value="100"/> <Parameter name="StepSize" type="float" value="0.01"/> <Parameter name="Duration" type="float" value="1"/> <Parameter name="TimeSeriesRequested" type="bool" value="1"/> <Parameter name="OutputStartTime" type="float" value="0"/> <Parameter name="Output Event" type="bool" value="0"/> <Parameter name="Start in Steady State" type="bool" value="0"/> <Parameter name="Use Values" type="bool" value="0"/> <Parameter name="Values" type="string" value=""/> <ParameterGroup name="ListOfParameters"> </ParameterGroup> <ParameterGroup name="ListOfTargets"> </ParameterGroup> </Problem> <Method name="LSODA Sensitivities" type="Sensitivities(LSODA)"> <Parameter name="Integrate Reduced Model" type="bool" value="0"/> <Parameter name="Relative Tolerance" type="unsignedFloat" value="9.9999999999999995e-07"/> <Parameter name="Absolute Tolerance" type="unsignedFloat" value="9.9999999999999998e-13"/> <Parameter name="Max Internal Steps" type="unsignedInteger" value="10000"/> <Parameter name="Max Internal Step Size" type="unsignedFloat" value="0"/> </Method> </Task> </ListOfTasks> <ListOfReports> <Report key="Report_10" name="Steady-State" taskType="steadyState" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Footer> <Object cn="CN=Root,Vector=TaskList[Steady-State]"/> </Footer> </Report> <Report key="Report_11" name="Time-Course" taskType="timeCourse" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Time-Course],Object=Description"/> </Header> <Footer> <Object cn="CN=Root,Vector=TaskList[Time-Course],Object=Result"/> </Footer> </Report> <Report key="Report_12" name="Elementary Flux Modes" taskType="fluxMode" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Footer> <Object cn="CN=Root,Vector=TaskList[Elementary Flux Modes],Object=Result"/> </Footer> </Report> <Report key="Report_13" name="Optimization" taskType="optimization" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Optimization],Object=Description"/> <Object cn="String=\[Function Evaluations\]"/> <Object cn="Separator=&#x09;"/> <Object cn="String=\[Best Value\]"/> <Object cn="Separator=&#x09;"/> <Object cn="String=\[Best Parameters\]"/> </Header> <Body> <Object cn="CN=Root,Vector=TaskList[Optimization],Problem=Optimization,Reference=Function Evaluations"/> <Object cn="Separator=&#x09;"/> <Object cn="CN=Root,Vector=TaskList[Optimization],Problem=Optimization,Reference=Best Value"/> <Object cn="Separator=&#x09;"/> <Object cn="CN=Root,Vector=TaskList[Optimization],Problem=Optimization,Reference=Best Parameters"/> </Body> <Footer> <Object cn="String=&#x0a;"/> <Object cn="CN=Root,Vector=TaskList[Optimization],Object=Result"/> </Footer> </Report> <Report key="Report_14" name="Parameter Estimation" taskType="parameterFitting" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Parameter Estimation],Object=Description"/> <Object cn="String=\[Function Evaluations\]"/> <Object cn="Separator=&#x09;"/> <Object cn="String=\[Best Value\]"/> <Object cn="Separator=&#x09;"/> <Object cn="String=\[Best Parameters\]"/> </Header> <Body> <Object cn="CN=Root,Vector=TaskList[Parameter Estimation],Problem=Parameter Estimation,Reference=Function Evaluations"/> <Object cn="Separator=&#x09;"/> <Object cn="CN=Root,Vector=TaskList[Parameter Estimation],Problem=Parameter Estimation,Reference=Best Value"/> <Object cn="Separator=&#x09;"/> <Object cn="CN=Root,Vector=TaskList[Parameter Estimation],Problem=Parameter Estimation,Reference=Best Parameters"/> </Body> <Footer> <Object cn="String=&#x0a;"/> <Object cn="CN=Root,Vector=TaskList[Parameter Estimation],Object=Result"/> </Footer> </Report> <Report key="Report_15" name="Metabolic Control Analysis" taskType="metabolicControlAnalysis" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Metabolic Control Analysis],Object=Description"/> </Header> <Footer> <Object cn="String=&#x0a;"/> <Object cn="CN=Root,Vector=TaskList[Metabolic Control Analysis],Object=Result"/> </Footer> </Report> <Report key="Report_16" name="Lyapunov Exponents" taskType="lyapunovExponents" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Lyapunov Exponents],Object=Description"/> </Header> <Footer> <Object cn="String=&#x0a;"/> <Object cn="CN=Root,Vector=TaskList[Lyapunov Exponents],Object=Result"/> </Footer> </Report> <Report key="Report_17" name="Time Scale Separation Analysis" taskType="timeScaleSeparationAnalysis" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Time Scale Separation Analysis],Object=Description"/> </Header> <Footer> <Object cn="String=&#x0a;"/> <Object cn="CN=Root,Vector=TaskList[Time Scale Separation Analysis],Object=Result"/> </Footer> </Report> <Report key="Report_18" name="Sensitivities" taskType="sensitivities" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Sensitivities],Object=Description"/> </Header> <Footer> <Object cn="String=&#x0a;"/> <Object cn="CN=Root,Vector=TaskList[Sensitivities],Object=Result"/> </Footer> </Report> <Report key="Report_19" name="Moieties" taskType="moieties" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Moieties],Object=Description"/> </Header> <Footer> <Object cn="String=&#x0a;"/> <Object cn="CN=Root,Vector=TaskList[Moieties],Object=Result"/> </Footer> </Report> <Report key="Report_20" name="Linear Noise Approximation" taskType="linearNoiseApproximation" separator="&#x09;" precision="6"> <Comment> Automatically generated report. </Comment> <Header> <Object cn="CN=Root,Vector=TaskList[Linear Noise Approximation],Object=Description"/> </Header> <Footer> <Object cn="String=&#x0a;"/> <Object cn="CN=Root,Vector=TaskList[Linear Noise Approximation],Object=Result"/> </Footer> </Report> </ListOfReports> <ListOfPlots> <PlotSpecification name="Time course" type="Plot2D" active="1" taskTypes=""> <Parameter name="log X" type="bool" value="0"/> <Parameter name="log Y" type="bool" value="0"/> <ListOfPlotItems> <PlotItem name="D" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[D],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="E" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[E],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="Hosp" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[Hosp],Reference=Value"/> </ListOfChannels> </PlotItem> <PlotItem name="I1" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="I2" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="I3" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="Itot" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[Itot],Reference=Value"/> </ListOfChannels> </PlotItem> <PlotItem name="R" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[R],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="S" type="Curve2D"> <Parameter name="Line type" type="unsignedInteger" value="0"/> <Parameter name="Line subtype" type="unsignedInteger" value="0"/> <Parameter name="Line width" type="unsignedFloat" value="1"/> <Parameter name="Symbol subtype" type="unsignedInteger" value="0"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Reference=Time"/> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[S],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> </ListOfPlotItems> </PlotSpecification> <PlotSpecification name="Histograms" type="Plot2D" active="0" taskTypes=""> <Parameter name="log X" type="bool" value="0"/> <Parameter name="log Y" type="bool" value="0"/> <ListOfPlotItems> <PlotItem name="D" type="Histogram1DItem"> <Parameter name="increment" type="float" value="1"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[D],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="E" type="Histogram1DItem"> <Parameter name="increment" type="float" value="1"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[E],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="Hosp" type="Histogram1DItem"> <Parameter name="increment" type="float" value="1"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[Hosp],Reference=Value"/> </ListOfChannels> </PlotItem> <PlotItem name="I1" type="Histogram1DItem"> <Parameter name="increment" type="float" value="1"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I1],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="I2" type="Histogram1DItem"> <Parameter name="increment" type="float" value="1"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I2],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="I3" type="Histogram1DItem"> <Parameter name="increment" type="float" value="1"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[I3],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> <PlotItem name="I_tot" type="Histogram1DItem"> <Parameter name="increment" type="float" value="1"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Values[Itot],Reference=Value"/> </ListOfChannels> </PlotItem> <PlotItem name="R" type="Histogram1DItem"> <Parameter name="increment" type="float" value="1"/> <Parameter name="Color" type="string" value="auto"/> <Parameter name="Recording Activity" type="string" value="during"/> <ListOfChannels> <ChannelSpec cn="CN=Root,Model=COVID-19 SEIR,Vector=Compartments[compartment],Vector=Metabolites[R],Reference=ParticleNumber"/> </ListOfChannels> </PlotItem> </ListOfPlotItems> </PlotSpecification> </ListOfPlots> <GUI> </GUI> <ListOfLayouts xmlns:xsi="http://www.w3.org/2001/XMLSchema-instance"> <Layout key="Layout_2" name="COPASI autolayout"> <Dimensions width="55.565563537674905" height="66.983317493274768"/> <ListOfMetabGlyphs> <MetaboliteGlyph key="Layout_3" name="MetabGlyph" metabolite="Metabolite_1"> <BoundingBox> <Position x="4.0659172458317556" y="109.7309709130088"/> <Dimensions width="36" height="28"/> </BoundingBox> </MetaboliteGlyph> <MetaboliteGlyph key="Layout_4" name="MetabGlyph" metabolite="Metabolite_2"> <BoundingBox> <Position x="148.47094729476783" y="0"/> <Dimensions width="28" height="28"/> </BoundingBox> </MetaboliteGlyph> <MetaboliteGlyph key="Layout_5" name="MetabGlyph" metabolite="Metabolite_4"> <BoundingBox> <Position x="232.33900603334024" y="166.50145743971868"/> <Dimensions width="36" height="28"/> </BoundingBox> </MetaboliteGlyph> <MetaboliteGlyph key="Layout_6" name="MetabGlyph" metabolite="Metabolite_3"> <BoundingBox> <Position x="155.31660789798093" y="164.81850489502722"/> <Dimensions width="36" height="28"/> </BoundingBox> </MetaboliteGlyph> <MetaboliteGlyph key="Layout_7" name="MetabGlyph" metabolite="Metabolite_0"> <BoundingBox> <Position x="90.643160151481268" y="74.902539590994081"/> <Dimensions width="28" height="28"/> </BoundingBox> </MetaboliteGlyph> <MetaboliteGlyph key="Layout_8" name="MetabGlyph" metabolite="Metabolite_6"> <BoundingBox> <Position x="77.88204352768291" y="246.09315688185723"/> <Dimensions width="28" height="28"/> </BoundingBox> </MetaboliteGlyph> <MetaboliteGlyph key="Layout_9" name="MetabGlyph" metabolite="Metabolite_5"> <BoundingBox> <Position x="376.65226778531041" y="252.63092740551684"/> <Dimensions width="28" height="28"/> </BoundingBox> </MetaboliteGlyph> </ListOfMetabGlyphs> <ListOfReactionGlyphs> <ReactionGlyph key="Layout_10" name="ReactionGlyph" reaction="Reaction_0"> <BoundingBox> <Position x="66.427178716759059" y="41.610177627702058"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="67.87287339534123" y="39.73761413792721"/> <End x="64.981484038176887" y="43.482741117476905"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_11" name="MetabReferenceGlyph" metaboliteGlyph="Layout_4" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="67.87287339534123" y="39.73761413792721"/> <End x="143.47094729476783" y="18.55645363361279"/> <BasePoint1 x="70.764262752505545" y="35.9924871583775"/> <BasePoint2 x="107.84045236292778" y="26.338188651107714"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_12" name="MetabReferenceGlyph" metaboliteGlyph="Layout_3" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="67.87287339534123" y="39.73761413792721"/> <End x="32.611672369825015" y="104.7309709130088"/> <BasePoint1 x="70.764262752505545" y="35.9924871583775"/> <BasePoint2 x="52.410814900456373" y="69.425447290805721"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_13" name="MetabReferenceGlyph" metaboliteGlyph="Layout_7" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="64.981484038176887" y="43.482741117476905"/> <End x="85.643160151481268" y="70.294743662992275"/> <BasePoint1 x="62.090094681012559" y="47.227868097026615"/> <BasePoint2 x="73.143780076955835" y="59.697587624896869"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_14" name="MetabReferenceGlyph" metaboliteGlyph="Layout_3" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="64.981484038176887" y="43.482741117476905"/> <End x="32.006159448786804" y="104.7309709130088"/> <BasePoint1 x="62.090094681012559" y="47.227868097026615"/> <BasePoint2 x="46.32527972560861" y="76.91570124990514"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_15" name="ReactionGlyph" reaction="Reaction_3"> <BoundingBox> <Position x="12.386586435847434" y="52.76389629770614"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="16.515448581129917" y="51.022474731605399"/> <End x="8.2577242905649513" y="54.50531786380688"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_16" name="MetabReferenceGlyph" metaboliteGlyph="Layout_7" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="16.515448581129917" y="51.022474731605399"/> <End x="85.643160151481268" y="79.062857895700915"/> <BasePoint1 x="24.773172871694868" y="47.539631599403933"/> <BasePoint2 x="57.272597584229302" y="62.430533964502047"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_17" name="MetabReferenceGlyph" metaboliteGlyph="Layout_3" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="8.2577242905649513" y="54.50531786380688"/> <End x="15.688757094020403" y="104.7309709130088"/> <BasePoint1 x="0" y="57.988160996008347"/> <BasePoint2 x="5.7799474743689672" y="82.230276737558938"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_18" name="ReactionGlyph" reaction="Reaction_5"> <BoundingBox> <Position x="261.34893990033294" y="118.7192099388019"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="257.49781999356497" y="118.63506231156732"/> <End x="265.2000598071009" y="118.80335756603647"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_19" name="MetabReferenceGlyph" metaboliteGlyph="Layout_6" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="257.49781999356497" y="118.63506231156732"/> <End x="196.31660789798093" y="160.66854904633709"/> <BasePoint1 x="249.79558018002905" y="118.46676705709818"/> <BasePoint2 x="221.13053408562098" y="139.52558423810035"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_20" name="MetabReferenceGlyph" metaboliteGlyph="Layout_5" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="265.2000598071009" y="118.80335756603647"/> <End x="257.30640306656221" y="161.50145743971868"/> <BasePoint1 x="272.90229962063682" y="118.97165282050561"/> <BasePoint2 x="267.02991129698347" y="140.27862894372944"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_21" name="ReactionGlyph" reaction="Reaction_1"> <BoundingBox> <Position x="165.3172517136415" y="98.624142350917822"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="166.76294639222365" y="96.751578861142974"/> <End x="163.87155703505931" y="100.49670584069267"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_22" name="MetabReferenceGlyph" metaboliteGlyph="Layout_4" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="166.76294639222365" y="96.751578861142974"/> <End x="164.19845659796161" y="33"/> <BasePoint1 x="169.65433574938797" y="93.006451881593264"/> <BasePoint2 x="167.64924351296588" y="62.066944195909208"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_23" name="MetabReferenceGlyph" metaboliteGlyph="Layout_6" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="166.76294639222365" y="96.751578861142974"/> <End x="172.50572914167878" y="159.81850489502722"/> <BasePoint1 x="169.65433574938797" y="93.006451881593264"/> <BasePoint2 x="171.80287978482446" y="125.47619664342281"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_24" name="MetabReferenceGlyph" metaboliteGlyph="Layout_7" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="163.87155703505931" y="100.49670584069267"/> <End x="123.64316015148127" y="94.075809953625111"/> <BasePoint1 x="160.980167677895" y="104.24183282024238"/> <BasePoint2 x="141.58881657539706" y="100.09510313182118"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_25" name="MetabReferenceGlyph" metaboliteGlyph="Layout_6" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="163.87155703505931" y="100.49670584069267"/> <End x="170.17363627346828" y="159.81850489502722"/> <BasePoint1 x="160.980167677895" y="104.24183282024238"/> <BasePoint2 x="164.85405463639057" y="132.96645060252223"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_26" name="ReactionGlyph" reaction="Reaction_9"> <BoundingBox> <Position x="191.69779723807068" y="246.20692348229454"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="199.62064536335353" y="242.22733851018762"/> <End x="183.77494911278779" y="250.18650845440146"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_27" name="MetabReferenceGlyph" metaboliteGlyph="Layout_5" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="199.62064536335353" y="242.22733851018762"/> <End x="238.01575601320928" y="199.50145743971868"/> <BasePoint1 x="215.46634161391927" y="234.26816856597378"/> <BasePoint2 x="230.70247287620572" y="214.89502051679275"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_28" name="MetabReferenceGlyph" metaboliteGlyph="Layout_8" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="183.77494911278779" y="250.18650845440146"/> <End x="110.88204352768291" y="259.60658950475835"/> <BasePoint1 x="167.92925286222206" y="258.14567839861536"/> <BasePoint2 x="135.44422413231104" y="260.86592643774031"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_29" name="ReactionGlyph" reaction="Reaction_2"> <BoundingBox> <Position x="208.40896807430516" y="96.825109002338309"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="209.85466275288729" y="94.952545512563461"/> <End x="206.96327339572298" y="98.697672492113156"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_30" name="MetabReferenceGlyph" metaboliteGlyph="Layout_4" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="209.85466275288729" y="94.952545512563461"/> <End x="174.84316501218757" y="33"/> <BasePoint1 x="212.74605211005164" y="91.207418533013751"/> <BasePoint2 x="194.51745590041068" y="61.167427521619452"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_31" name="MetabReferenceGlyph" metaboliteGlyph="Layout_5" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="209.85466275288729" y="94.952545512563461"/> <End x="242.33997123451391" y="161.50145743971868"/> <BasePoint1 x="212.74605211005164" y="91.207418533013751"/> <BasePoint2 x="228.26585901157387" y="125.41815624147878"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_32" name="MetabReferenceGlyph" metaboliteGlyph="Layout_7" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="206.96327339572298" y="98.697672492113156"/> <End x="123.64316015148127" y="91.489970342140865"/> <BasePoint1 x="204.07188403855866" y="102.44279947166287"/> <BasePoint2 x="163.13467475572889" y="97.902666651789289"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_33" name="MetabReferenceGlyph" metaboliteGlyph="Layout_5" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="206.96327339572298" y="98.697672492113156"/> <End x="239.07727875306085" y="161.50145743971868"/> <BasePoint1 x="204.07188403855866" y="102.44279947166287"/> <BasePoint2 x="220.85173405651869" y="132.9084102005782"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_34" name="ReactionGlyph" reaction="Reaction_4"> <BoundingBox> <Position x="86.169724969862116" y="175.06570773377311"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="78.607190437254658" y="172.31133103467218"/> <End x="93.732259502469574" y="177.82008443287404"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_35" name="MetabReferenceGlyph" metaboliteGlyph="Layout_3" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="78.607190437254658" y="172.31133103467218"/> <End x="40.335676334463912" y="142.7309709130088"/> <BasePoint1 x="63.482121372039742" y="166.80257763647035"/> <BasePoint2 x="48.127631586948098" y="153.38958592518912"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_36" name="MetabReferenceGlyph" metaboliteGlyph="Layout_6" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="93.732259502469574" y="177.82008443287404"/> <End x="150.31660789798093" y="180.42785669987063"/> <BasePoint1 x="108.85732856768449" y="183.32883783107587"/> <BasePoint2 x="133.36823549913643" y="183.25553561502372"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_37" name="ReactionGlyph" reaction="Reaction_6"> <BoundingBox> <Position x="330.48771318659948" y="215.15593560153107"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="323.47205009900097" y="210.84946210324117"/> <End x="337.50337627419799" y="219.46240909982097"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_38" name="MetabReferenceGlyph" metaboliteGlyph="Layout_5" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="323.47205009900097" y="210.84946210324117"/> <End x="273.33900603334024" y="188.95986345874817"/> <BasePoint1 x="309.44072392380394" y="202.23651510666133"/> <BasePoint2 x="287.88203343477284" y="193.44495253355981"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_39" name="MetabReferenceGlyph" metaboliteGlyph="Layout_9" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="337.50337627419799" y="219.46240909982097"/> <End x="371.65226778531041" y="247.9038965030947"/> <BasePoint1 x="351.53470244939501" y="228.07535609640081"/> <BasePoint2 x="365.10131666115194" y="240.14286304889271"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_40" name="ReactionGlyph" reaction="Reaction_8"> <BoundingBox> <Position x="157.80271177354456" y="281.59649829691881"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="161.87443999205948" y="277.5327656975773"/> <End x="153.73098355502967" y="285.66023089626032"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_41" name="MetabReferenceGlyph" metaboliteGlyph="Layout_6" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="161.87443999205948" y="277.5327656975773"/> <End x="172.62472430179963" y="197.81850489502722"/> <BasePoint1 x="170.01789642908926" y="269.40530049889429"/> <BasePoint2 x="173.35717447470191" y="231.58003639729003"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_42" name="MetabReferenceGlyph" metaboliteGlyph="Layout_8" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="153.73098355502967" y="285.66023089626032"/> <End x="110.88204352768291" y="272.01365740154836"/> <BasePoint1 x="145.58752711799988" y="293.78769609494333"/> <BasePoint2 x="126.19892121358394" y="284.93254304791657"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> <ReactionGlyph key="Layout_43" name="ReactionGlyph" reaction="Reaction_7"> <BoundingBox> <Position x="13.199158956472061" y="215.1531542258399"/> <Dimensions width="0" height="0"/> </BoundingBox> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="LineSegment"> <Start x="9.7083526423795092" y="208.33504492739746"/> <End x="16.689965270564613" y="221.97126352428234"/> </CurveSegment> </ListOfCurveSegments> </Curve> <ListOfMetaboliteReferenceGlyphs> <MetaboliteReferenceGlyph key="Layout_44" name="MetabReferenceGlyph" metaboliteGlyph="Layout_3" role="substrate"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="9.7083526423795092" y="208.33504492739746"/> <End x="16.888300348161181" y="142.7309709130088"/> <BasePoint1 x="2.7267400141943909" y="194.69882633051265"/> <BasePoint2 x="8.0621170241315099" y="165.30584397253949"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> <MetaboliteReferenceGlyph key="Layout_45" name="MetabReferenceGlyph" metaboliteGlyph="Layout_8" role="product"> <Curve> <ListOfCurveSegments> <CurveSegment xsi:type="CubicBezier"> <Start x="16.689965270564613" y="221.97126352428234"/> <End x="72.88204352768291" y="253.27268122370876"/> <BasePoint1 x="23.671577898749732" y="235.60748212116715"/> <BasePoint2 x="50.022213870262604" y="247.84913632165916"/> </CurveSegment> </ListOfCurveSegments> </Curve> </MetaboliteReferenceGlyph> </ListOfMetaboliteReferenceGlyphs> </ReactionGlyph> </ListOfReactionGlyphs> <ListOfTextGlyphs> <TextGlyph key="Layout_46" name="TextGlyph" graphicalObject="Layout_3" originOfText="Metabolite_1"> <BoundingBox> <Position x="4.0659172458317556" y="109.7309709130088"/> <Dimensions width="32" height="24"/> </BoundingBox> </TextGlyph> <TextGlyph key="Layout_47" name="TextGlyph" graphicalObject="Layout_4" originOfText="Metabolite_2"> <BoundingBox> <Position x="148.47094729476783" y="0"/> <Dimensions width="24" height="24"/> </BoundingBox> </TextGlyph> <TextGlyph key="Layout_48" name="TextGlyph" graphicalObject="Layout_5" originOfText="Metabolite_4"> <BoundingBox> <Position x="232.33900603334024" y="166.50145743971868"/> <Dimensions width="32" height="24"/> </BoundingBox> </TextGlyph> <TextGlyph key="Layout_49" name="TextGlyph" graphicalObject="Layout_6" originOfText="Metabolite_3"> <BoundingBox> <Position x="155.31660789798093" y="164.81850489502722"/> <Dimensions width="32" height="24"/> </BoundingBox> </TextGlyph> <TextGlyph key="Layout_50" name="TextGlyph" graphicalObject="Layout_7" originOfText="Metabolite_0"> <BoundingBox> <Position x="90.643160151481268" y="74.902539590994081"/> <Dimensions width="24" height="24"/> </BoundingBox> </TextGlyph> <TextGlyph key="Layout_51" name="TextGlyph" graphicalObject="Layout_8" originOfText="Metabolite_6"> <BoundingBox> <Position x="77.88204352768291" y="246.09315688185723"/> <Dimensions width="24" height="24"/> </BoundingBox> </TextGlyph> <TextGlyph key="Layout_52" name="TextGlyph" graphicalObject="Layout_9" originOfText="Metabolite_5"> <BoundingBox> <Position x="376.65226778531041" y="252.63092740551684"/> <Dimensions width="24" height="24"/> </BoundingBox> </TextGlyph> </ListOfTextGlyphs> </Layout> </ListOfLayouts> <ListOfUnitDefinitions> <UnitDefinition key="Unit_1" name="meter" symbol="m"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Unit_0"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-29T14:04:13Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> m </Expression> </UnitDefinition> <UnitDefinition key="Unit_5" name="second" symbol="s"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Unit_4"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-29T14:04:13Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> s </Expression> </UnitDefinition> <UnitDefinition key="Unit_17" name="item" symbol="#"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Unit_16"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-29T14:04:13Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> # </Expression> </UnitDefinition> <UnitDefinition key="Unit_35" name="liter" symbol="l"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Unit_34"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-29T14:04:13Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> 0.001*m^3 </Expression> </UnitDefinition> <UnitDefinition key="Unit_69" name="day" symbol="d"> <MiriamAnnotation> <rdf:RDF xmlns:dcterms="http://purl.org/dc/terms/" xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> <rdf:Description rdf:about="#Unit_68"> <dcterms:created> <rdf:Description> <dcterms:W3CDTF>2020-03-29T14:04:13Z</dcterms:W3CDTF> </rdf:Description> </dcterms:created> </rdf:Description> </rdf:RDF> </MiriamAnnotation> <Expression> 86400*s </Expression> </UnitDefinition> </ListOfUnitDefinitions> </COPASI>
Component Pascal
5
pmendes/COVID19
Models/COVID-19-SEIR.cps
[ "MIT" ]