diff options
Diffstat (limited to 'stdlib/source/test/lux/data')
-rw-r--r-- | stdlib/source/test/lux/data/binary.lux | 16 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/collection/array.lux | 82 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/collection/dictionary.lux | 10 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/collection/dictionary/ordered.lux | 8 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/collection/list.lux | 22 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/collection/sequence.lux | 26 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/collection/set.lux | 52 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/collection/tree/finger.lux | 46 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/color/named.lux | 42 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/format/tar.lux | 4 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/sum.lux | 22 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/text/encoding.lux | 56 | ||||
-rw-r--r-- | stdlib/source/test/lux/data/text/unicode/block.lux | 50 |
13 files changed, 218 insertions, 218 deletions
diff --git a/stdlib/source/test/lux/data/binary.lux b/stdlib/source/test/lux/data/binary.lux index d179058fd..650ee562a 100644 --- a/stdlib/source/test/lux/data/binary.lux +++ b/stdlib/source/test/lux/data/binary.lux @@ -121,10 +121,10 @@ [3 !.bytes/8 !.with/8!])) (_.cover [!.slice] (let [random_slice (!.slice offset length sample) - idxs (: (List Nat) - (case length - 0 (list) - _ (enum.range n.enum 0 (-- length)))) + idxs (is (List Nat) + (case length + 0 (list) + _ (enum.range n.enum 0 (-- length)))) reader (function (_ binary idx) (!.bytes/1 idx binary))] (and (n.= length (!.size random_slice)) @@ -182,10 +182,10 @@ (..binary_io 3 /.read/64! /.write/64! value)))) (_.cover [/.slice] (let [random_slice (try.trusted (/.slice offset length sample)) - idxs (: (List Nat) - (case length - 0 (list) - _ (enum.range n.enum 0 (-- length)))) + idxs (is (List Nat) + (case length + 0 (list) + _ (enum.range n.enum 0 (-- length)))) reader (function (_ binary idx) (/.read/8! idx binary))] (and (n.= length (/.size random_slice)) diff --git a/stdlib/source/test/lux/data/collection/array.lux b/stdlib/source/test/lux/data/collection/array.lux index b41a178d2..1d0d95f34 100644 --- a/stdlib/source/test/lux/data/collection/array.lux +++ b/stdlib/source/test/lux/data/collection/array.lux @@ -63,11 +63,11 @@ evens (random.array size (random.only n.even? random.nat))] ($_ _.and (let [(open "/#[0]") /.functor - choose (: (-> Nat (Maybe Text)) - (function (_ value) - (if (n.even? value) - {.#Some (# n.decimal encoded value)} - {.#None})))] + choose (is (-> Nat (Maybe Text)) + (function (_ value) + (if (n.even? value) + {.#Some (# n.decimal encoded value)} + {.#None})))] (_.cover [/.one] (case [(|> evens (/#each (# n.decimal encoded)) @@ -144,16 +144,16 @@ (!.each $ it)))) (_.for [!.mix] ($mix.spec ..injection /.equivalence - (: (Mix !.Array) - (function (_ $ init it) - (!.mix (function (_ index item output) - ($ item output)) - init - it))))) + (is (Mix !.Array) + (function (_ $ init it) + (!.mix (function (_ index item output) + ($ item output)) + init + it))))) (_.cover [!.empty !.size] - (n.= size (!.size (: (Array Nat) - (!.empty size))))) + (n.= size (!.size (is (Array Nat) + (!.empty size))))) (_.cover [!.type] (case !.Array (pattern (<| {.#Named (symbol !.Array)} @@ -165,44 +165,44 @@ false)) (_.cover [!.lacks?] (let [the_array (|> (!.empty 2) - (: (Array Nat)) + (is (Array Nat)) (!.has! 0 expected))] (and (not (!.lacks? 0 the_array)) (!.lacks? 1 the_array)))) (_.cover [!.item !.has!] (|> (!.empty 2) - (: (Array Nat)) + (is (Array Nat)) (!.has! 0 expected) (!.item 0) (n.= expected))) (_.cover [!.lacks!] (|> (!.empty 1) - (: (Array Nat)) + (is (Array Nat)) (!.has! 0 expected) (!.lacks! 0) (!.lacks? 0))) (_.cover [!.lacks?] (let [the_array (|> (!.empty 2) - (: (Array Nat)) + (is (Array Nat)) (!.has! 0 expected))] (and (not (!.lacks? 0 the_array)) (!.lacks? 1 the_array)))) (_.cover [!.has?] (let [the_array (|> (!.empty 2) - (: (Array Nat)) + (is (Array Nat)) (!.has! 0 expected))] (and (!.has? 0 the_array) (not (!.has? 1 the_array))))) (_.cover [!.revised!] (|> (!.empty 1) - (: (Array Nat)) + (is (Array Nat)) (!.has! 0 base) (!.revised! 0 (n.+ shift)) (!.item 0) (n.= expected))) (_.cover [!.upsert!] (let [the_array (|> (!.empty 2) - (: (Array Nat)) + (is (Array Nat)) (!.has! 0 base) (!.upsert! 0 dummy (n.+ shift)) (!.upsert! 1 base (n.+ shift)))] @@ -211,8 +211,8 @@ (do ! [occupancy (# ! each (n.% (++ size)) random.nat)] (_.cover [!.occupancy !.vacancy] - (let [the_array (loop [output (: (Array Nat) - (!.empty size)) + (let [the_array (loop [output (is (Array Nat) + (!.empty size)) idx 0] (if (n.< occupancy idx) (again (!.has! idx expected output) @@ -243,8 +243,8 @@ (do ! [amount (# ! each (n.% (++ size)) random.nat)] (_.cover [!.copy!] - (let [copy (: (Array Nat) - (!.empty size))] + (let [copy (is (Array Nat) + (!.empty size))] (exec (!.copy! amount 0 the_array 0 copy) (# (list.equivalence n.equivalence) = (list.first amount (!.list {.#None} the_array)) @@ -263,11 +263,11 @@ (|> the_array (!.list {.#None}) (# (list.equivalence n.equivalence) = evens)))))) - (let [choose (: (-> Nat (Maybe Text)) - (function (_ value) - (if (n.even? value) - {.#Some (# n.decimal encoded value)} - {.#None})))] + (let [choose (is (-> Nat (Maybe Text)) + (function (_ value) + (if (n.even? value) + {.#Some (# n.decimal encoded value)} + {.#None})))] (_.cover [!.one] (|> evens (!.one choose) @@ -320,8 +320,8 @@ ..search (_.cover [/.empty /.size] - (n.= size (/.size (: (Array Nat) - (/.empty size))))) + (n.= size (/.size (is (Array Nat) + (/.empty size))))) (_.cover [/.type_name] (case /.Array (pattern (<| {.#Named (symbol /.Array)} @@ -334,7 +334,7 @@ false)) (_.cover [/.read! /.write!] (let [the_array (|> (/.empty 2) - (: (Array Nat)) + (is (Array Nat)) (/.write! 0 expected))] (case [(/.read! 0 the_array) (/.read! 1 the_array)] @@ -345,7 +345,7 @@ false))) (_.cover [/.delete!] (let [the_array (|> (/.empty 1) - (: (Array Nat)) + (is (Array Nat)) (/.write! 0 expected))] (case [(/.read! 0 the_array) (/.read! 0 (/.delete! 0 the_array))] @@ -356,19 +356,19 @@ false))) (_.cover [/.lacks?] (let [the_array (|> (/.empty 2) - (: (Array Nat)) + (is (Array Nat)) (/.write! 0 expected))] (and (not (/.lacks? 0 the_array)) (/.lacks? 1 the_array)))) (_.cover [/.contains?] (let [the_array (|> (/.empty 2) - (: (Array Nat)) + (is (Array Nat)) (/.write! 0 expected))] (and (/.contains? 0 the_array) (not (/.contains? 1 the_array))))) (_.cover [/.update!] (let [the_array (|> (/.empty 1) - (: (Array Nat)) + (is (Array Nat)) (/.write! 0 base) (/.update! 0 (n.+ shift)))] (case (/.read! 0 the_array) @@ -379,7 +379,7 @@ false))) (_.cover [/.upsert!] (let [the_array (|> (/.empty 2) - (: (Array Nat)) + (is (Array Nat)) (/.write! 0 base) (/.upsert! 0 dummy (n.+ shift)) (/.upsert! 1 base (n.+ shift)))] @@ -394,8 +394,8 @@ (do ! [occupancy (# ! each (n.% (++ size)) random.nat)] (_.cover [/.occupancy /.vacancy] - (let [the_array (loop [output (: (Array Nat) - (/.empty size)) + (let [the_array (loop [output (is (Array Nat) + (/.empty size)) idx 0] (if (n.< occupancy idx) (again (/.write! idx expected output) @@ -426,8 +426,8 @@ (do ! [amount (# ! each (n.% (++ size)) random.nat)] (_.cover [/.copy!] - (let [copy (: (Array Nat) - (/.empty size))] + (let [copy (is (Array Nat) + (/.empty size))] (exec (/.copy! amount 0 the_array 0 copy) (# (list.equivalence n.equivalence) = (list.first amount (/.list {.#None} the_array)) diff --git a/stdlib/source/test/lux/data/collection/dictionary.lux b/stdlib/source/test/lux/data/collection/dictionary.lux index 1054e5248..0a1f9d295 100644 --- a/stdlib/source/test/lux/data/collection/dictionary.lux +++ b/stdlib/source/test/lux/data/collection/dictionary.lux @@ -54,11 +54,11 @@ (do ! [constant random.nat - .let [hash (: (Hash Nat) - (implementation - (def: &equivalence n.equivalence) - (def: (hash _) - constant)))]] + .let [hash (is (Hash Nat) + (implementation + (def: &equivalence n.equivalence) + (def: (hash _) + constant)))]] (_.cover [/.key_hash] (same? hash (/.key_hash (/.empty hash))))) diff --git a/stdlib/source/test/lux/data/collection/dictionary/ordered.lux b/stdlib/source/test/lux/data/collection/dictionary/ordered.lux index 3e628ec45..c20a3b480 100644 --- a/stdlib/source/test/lux/data/collection/dictionary/ordered.lux +++ b/stdlib/source/test/lux/data/collection/dictionary/ordered.lux @@ -57,10 +57,10 @@ (n.< left right)) pairs) sorted_values (list#each product.right sorted_pairs) - (open "list#[0]") (list.equivalence (: (Equivalence [Nat Nat]) - (function (_ [kr vr] [ks vs]) - (and (n.= kr ks) - (n.= vr vs))))) + (open "list#[0]") (list.equivalence (is (Equivalence [Nat Nat]) + (function (_ [kr vr] [ks vs]) + (and (n.= kr ks) + (n.= vr vs))))) (open "/#[0]") (/.equivalence n.equivalence)]] ($_ _.and (_.for [/.equivalence] diff --git a/stdlib/source/test/lux/data/collection/list.lux b/stdlib/source/test/lux/data/collection/list.lux index 88ce2f5b9..c1440d110 100644 --- a/stdlib/source/test/lux/data/collection/list.lux +++ b/stdlib/source/test/lux/data/collection/list.lux @@ -281,12 +281,12 @@ (open "/#[0]") /.functor (open "/#[0]") /.monoid - +/2 (: (-> Nat Nat Nat) - (function (_ left right) - ($_ n.+ left right))) - +/3 (: (-> Nat Nat Nat Nat) - (function (_ left mid right) - ($_ n.+ left mid right)))] + +/2 (is (-> Nat Nat Nat) + (function (_ left right) + ($_ n.+ left right))) + +/3 (is (-> Nat Nat Nat Nat) + (function (_ left mid right) + ($_ n.+ left mid right)))] (do [! random.monad] [sample/0 ..random sample/1 ..random @@ -374,11 +374,11 @@ Test (let [(open "/#[0]") /.functor - choice (: (-> Nat (Maybe Text)) - (function (_ value) - (if (n.even? value) - {.#Some (# n.decimal encoded value)} - {.#None})))] + choice (is (-> Nat (Maybe Text)) + (function (_ value) + (if (n.even? value) + {.#Some (# n.decimal encoded value)} + {.#None})))] (do [! random.monad] [sample ..random] ($_ _.and diff --git a/stdlib/source/test/lux/data/collection/sequence.lux b/stdlib/source/test/lux/data/collection/sequence.lux index 125dfaac9..34e1b13c2 100644 --- a/stdlib/source/test/lux/data/collection/sequence.lux +++ b/stdlib/source/test/lux/data/collection/sequence.lux @@ -116,14 +116,14 @@ (and (/.within_bounds? sample good_index) (not (/.within_bounds? sample bad_index)))) (_.cover [/.index_out_of_bounds] - (let [fails! (: (All (_ a) (-> (Try a) Bit)) - (function (_ situation) - (case situation - {try.#Success member} - false - - {try.#Failure error} - (exception.match? /.index_out_of_bounds error))))] + (let [fails! (is (All (_ a) (-> (Try a) Bit)) + (function (_ situation) + (case situation + {try.#Success member} + false + + {try.#Failure error} + (exception.match? /.index_out_of_bounds error))))] (and (fails! (/.item bad_index sample)) (fails! (/.has bad_index non_member sample)) (fails! (/.revised bad_index ++ sample))))) @@ -195,11 +195,11 @@ (/.size negatives)))))) (_.cover [/.one] (let [(open "/#[0]") /.functor - choice (: (-> Nat (Maybe Text)) - (function (_ value) - (if (n.even? value) - {.#Some (# n.decimal encoded value)} - {.#None})))] + choice (is (-> Nat (Maybe Text)) + (function (_ value) + (if (n.even? value) + {.#Some (# n.decimal encoded value)} + {.#None})))] (case [(|> sample (/.only n.even?) (/#each (# n.decimal encoded)) diff --git a/stdlib/source/test/lux/data/collection/set.lux b/stdlib/source/test/lux/data/collection/set.lux index dee48cc02..0d6f31475 100644 --- a/stdlib/source/test/lux/data/collection/set.lux +++ b/stdlib/source/test/lux/data/collection/set.lux @@ -1,24 +1,24 @@ (.using - [library - [lux "*" - ["_" test {"+" Test}] - [abstract - [hash {"+" Hash}] - [monad {"+" do}] - [\\specification - ["$[0]" equivalence] - ["$[0]" hash] - ["$[0]" monoid]]] - [data - ["[0]" bit ("[1]#[0]" equivalence)] - [collection - ["[0]" list]]] - [math - ["[0]" random {"+" Random}] - [number - ["n" nat]]]]] - [\\library - ["[0]" / ("#[0]" equivalence)]]) + [library + [lux "*" + ["_" test {"+" Test}] + [abstract + [hash {"+" Hash}] + [monad {"+" do}] + [\\specification + ["$[0]" equivalence] + ["$[0]" hash] + ["$[0]" monoid]]] + [data + ["[0]" bit ("[1]#[0]" equivalence)] + [collection + ["[0]" list]]] + [math + ["[0]" random {"+" Random}] + [number + ["n" nat]]]]] + [\\library + ["[0]" / ("#[0]" equivalence)]]) (def: gen_nat (Random Nat) @@ -53,12 +53,12 @@ (/.empty? (/.empty n.hash))) (do ! [hash (# ! each (function (_ constant) - (: (Hash Nat) - (implementation - (def: &equivalence n.equivalence) - - (def: (hash _) - constant)))) + (is (Hash Nat) + (implementation + (def: &equivalence n.equivalence) + + (def: (hash _) + constant)))) random.nat)] (_.cover [/.member_hash] (same? hash (/.member_hash (/.empty hash))))) diff --git a/stdlib/source/test/lux/data/collection/tree/finger.lux b/stdlib/source/test/lux/data/collection/tree/finger.lux index 804bed4bb..06c77591e 100644 --- a/stdlib/source/test/lux/data/collection/tree/finger.lux +++ b/stdlib/source/test/lux/data/collection/tree/finger.lux @@ -1,32 +1,32 @@ (.using - [library - [lux "*" - ["_" test {"+" Test}] - [abstract - [monad {"+" do}]] - [control - ["[0]" maybe ("[1]#[0]" functor)]] - [data - ["[0]" text ("[1]#[0]" equivalence monoid)] - [collection - ["[0]" list ("[1]#[0]" mix)]]] - [math - ["[0]" random] - [number - ["n" nat]]] - [type {"+" :by_example}]]] - [\\library - ["[0]" /]]) + [library + [lux "*" + ["_" test {"+" Test}] + [abstract + [monad {"+" do}]] + [control + ["[0]" maybe ("[1]#[0]" functor)]] + [data + ["[0]" text ("[1]#[0]" equivalence monoid)] + [collection + ["[0]" list ("[1]#[0]" mix)]]] + [math + ["[0]" random] + [number + ["n" nat]]] + [type {"+" by_example}]]] + [\\library + ["[0]" /]]) (def: builder (/.builder text.monoid)) (def: :@: - (:by_example [@] - (/.Builder @ Text) - ..builder - - @)) + (by_example [@] + (/.Builder @ Text) + ..builder + + @)) (def: .public test Test diff --git a/stdlib/source/test/lux/data/color/named.lux b/stdlib/source/test/lux/data/color/named.lux index 055c76259..e7be0c11e 100644 --- a/stdlib/source/test/lux/data/color/named.lux +++ b/stdlib/source/test/lux/data/color/named.lux @@ -1,22 +1,22 @@ (.using - [library - [lux "*" - ["_" test {"+" Test}] - [abstract - [monad {"+" do}]] - [data - [collection - ["[0]" list] - ["[0]" set]]] - [macro - ["[0]" template]] - [math - ["[0]" random {"+" Random}] - [number - ["n" nat]]]]] - [\\library - ["[0]" / - ["/[1]" //]]]) + [library + [lux "*" + ["_" test {"+" Test}] + [abstract + [monad {"+" do}]] + [data + [collection + ["[0]" list] + ["[0]" set]]] + [macro + ["[0]" template]] + [math + ["[0]" random {"+" Random}] + [number + ["n" nat]]]]] + [\\library + ["[0]" / + ["/[1]" //]]]) (with_expansions [<colors> (as_is [letter/a [/.alice_blue @@ -202,9 +202,9 @@ )] (def: all_colors (list.together (`` (list (~~ (template [<definition> <by_letter>] - [((: (-> Any (List //.Color)) - (function (_ _) - (`` (list (~~ (template.spliced <by_letter>)))))) + [((is (-> Any (List //.Color)) + (function (_ _) + (`` (list (~~ (template.spliced <by_letter>)))))) 123)] <colors>)))))) diff --git a/stdlib/source/test/lux/data/format/tar.lux b/stdlib/source/test/lux/data/format/tar.lux index f09796461..d38efe7ec 100644 --- a/stdlib/source/test/lux/data/format/tar.lux +++ b/stdlib/source/test/lux/data/format/tar.lux @@ -205,8 +205,8 @@ (<b>.result /.parser))] (in (case (sequence.list tar) (pattern (list {<tag> [actual_path actual_moment actual_mode actual_ownership actual_content]})) - (let [seconds (: (-> Instant Int) - (|>> instant.relative (duration.ticks duration.second)))] + (let [seconds (is (-> Instant Int) + (|>> instant.relative (duration.ticks duration.second)))] (and (text#= (/.from_path expected_path) (/.from_path actual_path)) (i.= (seconds expected_moment) diff --git a/stdlib/source/test/lux/data/sum.lux b/stdlib/source/test/lux/data/sum.lux index 6dc6eeb9e..6d9e6cc5e 100644 --- a/stdlib/source/test/lux/data/sum.lux +++ b/stdlib/source/test/lux/data/sum.lux @@ -38,32 +38,32 @@ (_.cover [/.left] (|> (/.left expected) - (: (Or Nat Nat)) + (is (Or Nat Nat)) (pipe.case {0 #0 actual} (n.= expected actual) _ false))) (_.cover [/.right] (|> (/.right expected) - (: (Or Nat Nat)) + (is (Or Nat Nat)) (pipe.case {0 #1 actual} (n.= expected actual) _ false))) (_.cover [/.either] (and (|> (/.left expected) - (: (Or Nat Nat)) + (is (Or Nat Nat)) (/.either (n.+ shift) (n.- shift)) (n.= (n.+ shift expected))) (|> (/.right expected) - (: (Or Nat Nat)) + (is (Or Nat Nat)) (/.either (n.+ shift) (n.- shift)) (n.= (n.- shift expected))))) (_.cover [/.then] (and (|> (/.left expected) - (: (Or Nat Nat)) + (is (Or Nat Nat)) (/.then (n.+ shift) (n.- shift)) (pipe.case {0 #0 actual} (n.= (n.+ shift expected) actual) _ false)) (|> (/.right expected) - (: (Or Nat Nat)) + (is (Or Nat Nat)) (/.then (n.+ shift) (n.- shift)) (pipe.case {0 #1 actual} (n.= (n.- shift expected) actual) _ false)))) (do ! @@ -71,8 +71,8 @@ expected (random.list size random.nat)] ($_ _.and (_.cover [/.lefts] - (let [actual (: (List (Or Nat Nat)) - (list#each /.left expected))] + (let [actual (is (List (Or Nat Nat)) + (list#each /.left expected))] (and (# (list.equivalence n.equivalence) = expected (/.lefts actual)) @@ -80,8 +80,8 @@ (list) (/.rights actual))))) (_.cover [/.rights] - (let [actual (: (List (Or Nat Nat)) - (list#each /.right expected))] + (let [actual (is (List (Or Nat Nat)) + (list#each /.right expected))] (and (# (list.equivalence n.equivalence) = expected (/.rights actual)) @@ -94,7 +94,7 @@ (if (n.even? value) (/.left value) (/.right value)))) - (: (List (Or Nat Nat))) + (is (List (Or Nat Nat))) /.partition)] (and (# (list.equivalence n.equivalence) = (list.only n.even? expected) diff --git a/stdlib/source/test/lux/data/text/encoding.lux b/stdlib/source/test/lux/data/text/encoding.lux index c848511a9..c8410b813 100644 --- a/stdlib/source/test/lux/data/text/encoding.lux +++ b/stdlib/source/test/lux/data/text/encoding.lux @@ -1,29 +1,29 @@ (.using - [library - [lux "*" - ["_" test {"+" Test}] - [abstract - [monad {"+" do}] - [\\specification - ["$[0]" codec]]] - [control - ["[0]" maybe] - ["[0]" try]] - [data - ["[0]" text ("[1]#[0]" equivalence)] - [collection - ["[0]" list ("[1]#[0]" mix)] - ["[0]" set]]] - [macro - ["[0]" template]] - [math - ["[0]" random {"+" Random}] - [number - ["n" nat]]]]] - [\\library - ["[0]" /]] - ["[0]" / "_" - ["[1][0]" utf8]]) + [library + [lux "*" + ["_" test {"+" Test}] + [abstract + [monad {"+" do}] + [\\specification + ["$[0]" codec]]] + [control + ["[0]" maybe] + ["[0]" try]] + [data + ["[0]" text ("[1]#[0]" equivalence)] + [collection + ["[0]" list ("[1]#[0]" mix)] + ["[0]" set]]] + [macro + ["[0]" template]] + [math + ["[0]" random {"+" Random}] + [number + ["n" nat]]]]] + [\\library + ["[0]" /]] + ["[0]" / "_" + ["[1][0]" utf8]]) (with_expansions [<encodings> (as_is [all/a [/.ascii]] @@ -183,9 +183,9 @@ /.koi8_u]] ) <named> (template [<definition> <by_letter>] - [((: (-> Any (List /.Encoding)) - (function (_ _) - (`` (list (~~ (template.spliced <by_letter>)))))) + [((is (-> Any (List /.Encoding)) + (function (_ _) + (`` (list (~~ (template.spliced <by_letter>)))))) [])] <encodings>)] diff --git a/stdlib/source/test/lux/data/text/unicode/block.lux b/stdlib/source/test/lux/data/text/unicode/block.lux index fa2ef3756..b54ec0d9c 100644 --- a/stdlib/source/test/lux/data/text/unicode/block.lux +++ b/stdlib/source/test/lux/data/text/unicode/block.lux @@ -1,26 +1,26 @@ (.using - [library - [lux "*" - ["_" test {"+" Test}] - [abstract - [monad {"+" do}] - [\\specification - ["$[0]" equivalence] - ["$[0]" hash] - ["$[0]" monoid]]] - [data - ["[0]" text] - [collection - ["[0]" set] - ["[0]" list]]] - [macro - ["[0]" template]] - [math - ["[0]" random {"+" Random}] - [number {"+" hex} - ["n" nat]]]]] - [\\library - ["[0]" /]]) + [library + [lux "*" + ["_" test {"+" Test}] + [abstract + [monad {"+" do}] + [\\specification + ["$[0]" equivalence] + ["$[0]" hash] + ["$[0]" monoid]]] + [data + ["[0]" text] + [collection + ["[0]" set] + ["[0]" list]]] + [macro + ["[0]" template]] + [math + ["[0]" random {"+" Random}] + [number {"+" hex} + ["n" nat]]]]] + [\\library + ["[0]" /]]) (def: .public random (Random /.Block) @@ -147,9 +147,9 @@ /.basic_latin/lower]] ) <named> (template [<definition> <part>] - [((: (-> Any (List /.Block)) - (function (_ _) - (`` (list (~~ (template.spliced <part>)))))) + [((is (-> Any (List /.Block)) + (function (_ _) + (`` (list (~~ (template.spliced <part>)))))) [])] <blocks>)] |