(herald "Station-to-station protocol" (algebra diffie-hellman))
(comment "CPSA 3.4.0")
(comment "All input read from station.scm")

Trees: 0 67 96 127.

Tree 0.

29 28 66 65 64 63 62 61 39 34 27 14 26 60 59 58 57 56 55 38 33 25 54 53 52 51 50 37 32 24 13 23 49 48 47 46 45 36 31 22 12 21 44 43 42 41 40 35 30 20 11 9 8 7 6 5 3 2 19 18 17 16 15 10 4 1 0
(defprotocol station-to-station diffie-hellman
  (defrole init
    (vars (x expn) (h base) (a b name))
    (trace (send (exp (gen) x))
      (recv (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))))
      (send (enc (enc (exp (gen) x) h (privk a)) (exp h x))))
    (uniq-gen x))
  (defrole resp
    (vars (y expn) (h base) (a b name))
    (trace (recv h)
      (send
        (cat (exp (gen) y)
          (enc (enc (exp (gen) y) h (privk b)) (exp h y))))
      (recv (enc (enc h (exp (gen) y) (privk a)) (exp h y))))
    (uniq-gen y)
    (absent (y h))))

Item 0, Children: 1 2 3.

(enc (enc (exp (gen) x) h (privk a)) (exp h x)) (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))) (exp (gen) x) ((a a) (b b) (h h) (x x)) init station-to-station 0
(defskeleton station-to-station
  (vars (a b name) (h base) (x expn))
  (defstrand init 3 (a a) (b b) (h h) (x x))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (label 0)
  (unrealized (0 1))
  (origs)
  (comment "3 in cohort - 3 not yet seen"))

Item 1, Parent: 0, Child: 4.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 1
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (1 1)) ((1 2) (0 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x x-0)
  (operation encryption-test (added-strand init 3)
    (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b))
      (exp (gen) (mul x x-0))) (0 1))
  (label 1)
  (parent 0)
  (unrealized (1 1))
  (comment "1 in cohort - 1 not yet seen"))

Item 2, Parent: 0.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) resp ((a a) (b b) (h (exp (gen) y)) (x x)) init station-to-station 2 (realized)
(defskeleton station-to-station
  (vars (a b name) (x y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (defstrand resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (uniq-gen x y)
  (operation encryption-test (added-strand resp 2)
    (enc (enc (exp (gen) y) (exp (gen) x) (privk b))
      (exp (gen) (mul x y))) (0 1))
  (label 2)
  (parent 0)
  (unrealized)
  (shape)
  (maps ((0) ((a a) (b b) (x x) (h (exp (gen) y)))))
  (origs))

Item 3, Parent: 0, Children: 5 6 7 8 9.

(exp h x) (exp h x) (enc (enc (exp (gen) x) h (privk a)) (exp h x)) (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))) (exp (gen) x) ((a a) (b b) (h h) (x x)) init station-to-station 3
(defskeleton station-to-station
  (vars (a b name) (h base) (x expn))
  (defstrand init 3 (a a) (b b) (h h) (x x))
  (deflistener (exp h x))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation encryption-test (added-listener (exp h x))
    (enc (enc h (exp (gen) x) (privk b)) (exp h x)) (0 1))
  (label 3)
  (parent 0)
  (unrealized (0 1) (1 0))
  (comment "5 in cohort - 5 not yet seen"))

Item 4, Parent: 1, Child: 10.

(exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 4
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((1 0) (2 0)) ((1 2) (0 1)) ((2 1) (1 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x x-0)
  (operation encryption-test (added-listener (exp (gen) (mul x x-0)))
    (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0))
      (exp (gen) (mul x x-0))) (1 1))
  (label 4)
  (parent 1)
  (unrealized (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 5, Parent: 3.

(gen) (gen) (enc (enc (exp (gen) x) (exp (gen) (rec x)) (privk a)) (gen)) (cat (exp (gen) (rec x)) (enc (enc (exp (gen) (rec x)) (exp (gen) x) (privk b)) (gen))) (exp (gen) x) ((a a) (b b) (h (exp (gen) (rec x))) (x x)) init station-to-station 5
(defskeleton station-to-station
  (vars (a b name) (x expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) (rec x))) (x x))
  (deflistener (gen))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation nonce-test (contracted (h (exp (gen) (rec x)))) (gen)
    (1 0))
  (label 5)
  (parent 3)
  (unrealized (0 1))
  (comment "empty cohort"))

Item 6, Parent: 3.

(exp (gen) x) (exp (gen) x) (enc (enc (exp (gen) x) (gen) (privk a)) (exp (gen) x)) (cat (gen) (enc (enc (gen) (exp (gen) x) (privk b)) (exp (gen) x))) (exp (gen) x) ((a a) (b b) (h (gen)) (x x)) init station-to-station 6
(defskeleton station-to-station
  (vars (a b name) (x expn))
  (defstrand init 3 (a a) (b b) (h (gen)) (x x))
  (deflistener (exp (gen) x))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation nonce-test (displaced 2 0 init 1) (exp (gen) x-0) (1 0))
  (label 6)
  (parent 3)
  (unrealized (0 1))
  (comment "empty cohort"))

Item 7, Parent: 3.

(exp (gen) x-0) (exp (gen) x-0) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) x-0)) (privk a)) (exp (gen) x-0)) (cat (exp (gen) (mul (rec x) x-0)) (enc (enc (exp (gen) (mul (rec x) x-0)) (exp (gen) x) (privk b)) (exp (gen) x-0))) (exp (gen) x) ((x x-0)) init ((a a) (b b) (h (exp (gen) (mul (rec x) x-0))) (x x)) init station-to-station 7
(defskeleton station-to-station
  (vars (a b name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) (mul (rec x) x-0))) (x x))
  (deflistener (exp (gen) x-0))
  (defstrand init 1 (x x-0))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)) ((2 0) (1 0)))
  (non-orig (privk a) (privk b))
  (uniq-gen x x-0)
  (operation nonce-test (added-strand init 1) (exp (gen) x-0) (1 0))
  (label 7)
  (parent 3)
  (unrealized (0 1))
  (comment "empty cohort"))

Item 8, Parent: 3.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (exp (gen) y) (exp (gen) y) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) y)) (privk a)) (exp (gen) y)) (cat (exp (gen) (mul (rec x) y)) (enc (enc (exp (gen) (mul (rec x) y)) (exp (gen) x) (privk b)) (exp (gen) y))) (exp (gen) x) ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) (mul (rec x) y))) (x x)) init station-to-station 8
(defskeleton station-to-station
  (vars (a b b-0 name) (h base) (x y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) (mul (rec x) y))) (x x))
  (deflistener (exp (gen) y))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)) ((2 1) (1 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (uniq-gen x y)
  (operation nonce-test (added-strand resp 2) (exp (gen) y) (1 0))
  (label 8)
  (parent 3)
  (unrealized (0 1))
  (comment "empty cohort"))

Item 9, Parent: 3, Children: 11 12 13 14.

(cat (exp h (mul x (rec w))) w) (cat (exp h (mul x (rec w))) w) (exp h x) (exp h x) (enc (enc (exp (gen) x) h (privk a)) (exp h x)) (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))) (exp (gen) x) ((a a) (b b) (h h) (x x)) init station-to-station 9
(defskeleton station-to-station
  (vars (a b name) (h base) (x expn) (w expr))
  (defstrand init 3 (a a) (b b) (h h) (x x))
  (deflistener (exp h x))
  (deflistener (cat (exp h (mul x (rec w))) w))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (precur (2 0))
  (operation nonce-test (added-listener (cat (exp h (mul x (rec w))) w))
    (exp h x) (1 0))
  (label 9)
  (parent 3)
  (unrealized (0 1) (2 0))
  (comment "4 in cohort - 4 not yet seen"))

Item 10, Parent: 4, Children: 15 16 17 18 19.

(cat (exp (gen) (mul x x-0 (rec w))) w) (cat (exp (gen) (mul x x-0 (rec w))) w) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 10
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn) (w expr))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) (mul x x-0 (rec w))) w))
  (precedes ((0 0) (3 0)) ((1 0) (3 0)) ((1 2) (0 1)) ((2 1) (1 1))
    ((3 1) (2 0)))
  (non-orig (privk a) (privk b))
  (uniq-gen x x-0)
  (precur (3 0))
  (operation nonce-test
    (added-listener (cat (exp (gen) (mul x x-0 (rec w))) w))
    (exp (gen) (mul x x-0)) (2 0))
  (label 10)
  (parent 4)
  (unrealized (3 0))
  (comment "5 in cohort - 5 not yet seen"))

Item 11, Parent: 9, Children: 20 21.

(cat (gen) w) (cat (gen) w) (exp (gen) w) (exp (gen) w) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) w)) (privk a)) (exp (gen) w)) (cat (exp (gen) (mul (rec x) w)) (enc (enc (exp (gen) (mul (rec x) w)) (exp (gen) x) (privk b)) (exp (gen) w))) (exp (gen) x) ((a a) (b b) (h (exp (gen) (mul (rec x) w))) (x x)) init station-to-station 11
(defskeleton station-to-station
  (vars (a b name) (x expn) (w expr))
  (defstrand init 3 (a a) (b b) (h (exp (gen) (mul (rec x) w))) (x x))
  (deflistener (exp (gen) w))
  (deflistener (cat (gen) w))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (precur (2 0))
  (operation nonce-test (contracted (h (exp (gen) (mul (rec x) w))))
    (gen) (2 0))
  (label 11)
  (parent 9)
  (unrealized (0 1))
  (comment "2 in cohort - 2 not yet seen"))

Item 12, Parent: 9, Children: 22 23.

(cat (exp (gen) x) w) (cat (exp (gen) x) w) (exp (gen) (mul w x)) (exp (gen) (mul w x)) (enc (enc (exp (gen) x) (exp (gen) w) (privk a)) (exp (gen) (mul w x))) (cat (exp (gen) w) (enc (enc (exp (gen) w) (exp (gen) x) (privk b)) (exp (gen) (mul w x)))) (exp (gen) x) ((a a) (b b) (h (exp (gen) w)) (x x)) init station-to-station 12
(defskeleton station-to-station
  (vars (a b name) (w expr) (x expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) w)) (x x))
  (deflistener (exp (gen) (mul w x)))
  (deflistener (cat (exp (gen) x) w))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (displaced 3 0 init 1) (exp (gen) x-0) (2 0))
  (label 12)
  (parent 9)
  (unrealized (0 1))
  (comment "2 in cohort - 2 not yet seen"))

Item 13, Parent: 9, Children: 24 25 26.

(exp (gen) x-0) (cat (exp (gen) x-0) w) (cat (exp (gen) x-0) w) (exp (gen) (mul w x-0)) (exp (gen) (mul w x-0)) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) w x-0)) (privk a)) (exp (gen) (mul w x-0))) (cat (exp (gen) (mul (rec x) w x-0)) (enc (enc (exp (gen) (mul (rec x) w x-0)) (exp (gen) x) (privk b)) (exp (gen) (mul w x-0)))) (exp (gen) x) ((x x-0)) init ((a a) (b b) (h (exp (gen) (mul (rec x) w x-0))) (x x)) init station-to-station 13
(defskeleton station-to-station
  (vars (a b name) (x expn) (w expr) (x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) (mul (rec x) w x-0)))
    (x x))
  (deflistener (exp (gen) (mul w x-0)))
  (deflistener (cat (exp (gen) x-0) w))
  (defstrand init 1 (x x-0))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 0) (2 0)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (added-strand init 1) (exp (gen) x-0) (2 0))
  (label 13)
  (parent 9)
  (unrealized (0 1))
  (comment "3 in cohort - 3 not yet seen"))

Item 14, Parent: 9, Children: 27 28 29.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) w) (cat (exp (gen) y) w) (exp (gen) (mul w y)) (exp (gen) (mul w y)) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) w y)) (privk a)) (exp (gen) (mul w y))) (cat (exp (gen) (mul (rec x) w y)) (enc (enc (exp (gen) (mul (rec x) w y)) (exp (gen) x) (privk b)) (exp (gen) (mul w y)))) (exp (gen) x) ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) (mul (rec x) w y))) (x x)) init station-to-station 14
(defskeleton station-to-station
  (vars (a b b-0 name) (h base) (x expn) (w expr) (y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) (mul (rec x) w y))) (x x))
  (deflistener (exp (gen) (mul w y)))
  (deflistener (cat (exp (gen) y) w))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y)
  (operation nonce-test (added-strand resp 2) (exp (gen) y) (2 0))
  (label 14)
  (parent 9)
  (unrealized (0 1))
  (comment "3 in cohort - 3 not yet seen"))

Item 15, Parent: 10.

(cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 15
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (precedes ((0 0) (3 0)) ((1 0) (3 0)) ((1 2) (0 1)) ((2 1) (1 1))
    ((3 1) (2 0)))
  (non-orig (privk a) (privk b))
  (uniq-gen x x-0)
  (precur (3 0))
  (operation nonce-test (contracted (x-1 x) (x-2 x-0) (w (mul x x-0)))
    (gen) (3 0))
  (label 15)
  (parent 10)
  (unrealized (2 0) (3 0))
  (comment "empty cohort"))

Item 16, Parent: 10.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) ((a b) (b b-0) (h (exp (gen) x-0)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (x x-0)) init station-to-station 16
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x)) (x x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (3 0)) ((1 0) (3 0)) ((1 2) (0 1)) ((2 1) (1 1))
    ((3 1) (2 0)))
  (non-orig (privk a) (privk b))
  (precur (3 0))
  (uniq-gen x x-0)
  (operation nonce-test (displaced 4 0 init 1) (exp (gen) x-1) (3 0))
  (label 16)
  (parent 10)
  (unrealized (3 0))
  (comment "empty cohort"))

Item 17, Parent: 10.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 17
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (3 0)) ((1 0) (3 0)) ((1 2) (0 1)) ((2 1) (1 1))
    ((3 1) (2 0)))
  (non-orig (privk a) (privk b))
  (precur (3 0))
  (uniq-gen x x-0)
  (operation nonce-test (displaced 4 1 init 1) (exp (gen) x-1) (3 0))
  (label 17)
  (parent 10)
  (unrealized (3 0))
  (comment "empty cohort"))

Item 18, Parent: 10.

(exp (gen) x-1) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((x x-1)) init ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 18
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-1) (mul x x-0 (rec x-1))))
  (defstrand init 1 (x x-1))
  (precedes ((0 0) (3 0)) ((1 0) (3 0)) ((1 2) (0 1)) ((2 1) (1 1))
    ((3 1) (2 0)) ((4 0) (3 0)))
  (non-orig (privk a) (privk b))
  (precur (3 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test (added-strand init 1) (exp (gen) x-1) (3 0))
  (label 18)
  (parent 10)
  (unrealized (2 0) (3 0))
  (comment "empty cohort"))

Item 19, Parent: 10.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-1)) (exp h y))) h (cat (exp (gen) y) (mul x x-0 (rec y))) (cat (exp (gen) y) (mul x x-0 (rec y))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((b b-1) (h h) (y y)) resp ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 19
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x x-0 y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x x-0 (rec y))))
  (defstrand resp 2 (b b-1) (h h) (y y))
  (precedes ((0 0) (3 0)) ((1 0) (3 0)) ((1 2) (0 1)) ((2 1) (1 1))
    ((3 1) (2 0)) ((4 1) (3 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (3 0))
  (uniq-gen x x-0 y)
  (operation nonce-test (added-strand resp 2) (exp (gen) y) (3 0))
  (label 19)
  (parent 10)
  (unrealized (2 0) (3 0))
  (comment "empty cohort"))

Item 20, Parent: 11, Child: 30.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 20
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (2 0)) ((0 0) (3 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0)
  (operation encryption-test (added-strand init 3)
    (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (0 1))
  (label 20)
  (parent 11)
  (unrealized (1 0) (2 0) (3 1))
  (comment "1 in cohort - 1 not yet seen"))

Item 21, Parent: 11.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (gen) (mul x y)) (cat (gen) (mul x y)) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) resp ((a a) (b b) (h (exp (gen) y)) (x x)) init station-to-station 21
(defskeleton station-to-station
  (vars (a b name) (x y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (gen) (mul x y)))
  (defstrand resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (3 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y)
  (operation encryption-test (added-strand resp 2)
    (enc (exp (gen) y) (exp (gen) x) (privk b)) (0 1))
  (label 21)
  (parent 11)
  (unrealized (1 0) (2 0))
  (comment "empty cohort"))

Item 22, Parent: 12, Child: 31.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 22
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (2 0)) ((0 0) (3 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0)
  (operation encryption-test (added-strand init 3)
    (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (0 1))
  (label 22)
  (parent 12)
  (unrealized (2 0) (3 1))
  (comment "1 in cohort - 1 not yet seen"))

Item 23, Parent: 12.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (exp (gen) x) y) (cat (exp (gen) x) y) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) resp ((a a) (b b) (h (exp (gen) y)) (x x)) init station-to-station 23
(defskeleton station-to-station
  (vars (a b name) (x y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) x) y))
  (defstrand resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (3 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y)
  (operation encryption-test (added-strand resp 2)
    (enc (exp (gen) y) (exp (gen) x) (privk b)) (0 1))
  (label 23)
  (parent 12)
  (unrealized (2 0))
  (comment "empty cohort"))

Item 24, Parent: 13, Child: 32.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 24
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (2 0)) ((0 0) (3 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0)
  (operation encryption-test (displaced 3 4 init 3)
    (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (0 1))
  (label 24)
  (parent 13)
  (unrealized (2 0) (3 1))
  (comment "1 in cohort - 1 not yet seen"))

Item 25, Parent: 13, Child: 33.

(enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x x-1)))) (exp (gen) x-1) (exp (gen) x-0) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (exp (gen) (mul x x-1)) (exp (gen) (mul x x-1)) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk a)) (exp (gen) (mul x x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-1)) init ((x x-0)) init ((a a) (b b) (h (exp (gen) x-1)) (x x)) init station-to-station 25
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-1)) (x x))
  (deflistener (exp (gen) (mul x x-1)))
  (deflistener (cat (exp (gen) x-0) (mul x (rec x-0) x-1)))
  (defstrand init 1 (x x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-1))
  (precedes ((0 0) (2 0)) ((0 0) (4 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 0) (2 0)) ((4 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0 x-1)
  (operation encryption-test (added-strand init 3)
    (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (0 1))
  (label 25)
  (parent 13)
  (unrealized (1 0) (2 0) (4 1))
  (comment "1 in cohort - 1 not yet seen"))

Item 26, Parent: 13.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (exp (gen) x-0) (cat (exp (gen) x-0) (mul x (rec x-0) y)) (cat (exp (gen) x-0) (mul x (rec x-0) y)) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) resp ((x x-0)) init ((a a) (b b) (h (exp (gen) y)) (x x)) init station-to-station 26
(defskeleton station-to-station
  (vars (a b name) (x x-0 y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) x-0) (mul x (rec x-0) y)))
  (defstrand init 1 (x x-0))
  (defstrand resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 0) (2 0))
    ((4 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0 y)
  (operation encryption-test (added-strand resp 2)
    (enc (exp (gen) y) (exp (gen) x) (privk b)) (0 1))
  (label 26)
  (parent 13)
  (unrealized (1 0) (2 0))
  (comment "empty cohort"))

Item 27, Parent: 14, Child: 34.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x (rec y) x-0)) (cat (exp (gen) y) (mul x (rec y) x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 27
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x y x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x (rec y) x-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (2 0)) ((0 0) (4 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 0) (2 0)) ((4 2) (0 1)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y x-0)
  (operation encryption-test (added-strand init 3)
    (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (0 1))
  (label 27)
  (parent 14)
  (unrealized (1 0) (2 0) (4 1))
  (comment "1 in cohort - 1 not yet seen"))

Item 28, Parent: 14.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) resp ((a a) (b b) (h (exp (gen) y)) (x x)) init station-to-station 28
(defskeleton station-to-station
  (vars (a b name) (x y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (3 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y)
  (operation encryption-test (displaced 4 3 resp 2)
    (enc (exp (gen) y-0) (exp (gen) x) (privk b-0)) (0 1))
  (label 28)
  (parent 14)
  (unrealized (2 0))
  (comment "empty cohort"))

Item 29, Parent: 14.

(cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) x) (privk b)) (exp (gen) (mul x y-0)))) (exp (gen) x) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x (rec y) y-0)) (cat (exp (gen) y) (mul x (rec y) y-0)) (exp (gen) (mul x y-0)) (exp (gen) (mul x y-0)) (enc (enc (exp (gen) x) (exp (gen) y-0) (privk a)) (exp (gen) (mul x y-0))) (cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) x) (privk b)) (exp (gen) (mul x y-0)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y-0)) resp ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) y-0)) (x x)) init station-to-station 29
(defskeleton station-to-station
  (vars (a b b-0 name) (h base) (x y y-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) y-0)) (x x))
  (deflistener (exp (gen) (mul x y-0)))
  (deflistener (cat (exp (gen) y) (mul x (rec y) y-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand resp 2 (b b) (h (exp (gen) x)) (y y-0))
  (precedes ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 1) (2 0))
    ((4 1) (2 0)))
  (absent (y-0 (exp (gen) x)) (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y y-0)
  (operation encryption-test (added-strand resp 2)
    (enc (exp (gen) y-0) (exp (gen) x) (privk b)) (0 1))
  (label 29)
  (parent 14)
  (unrealized (1 0) (2 0))
  (comment "empty cohort"))

Item 30, Parent: 20, Child: 35.

(exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 30
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (4 0)) ((3 2) (0 1)) ((4 1) (3 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0)
  (operation encryption-test (added-listener (exp (gen) (mul x x-0)))
    (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0))
      (exp (gen) (mul x x-0))) (3 1))
  (label 30)
  (parent 20)
  (unrealized (1 0) (2 0) (4 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 31, Parent: 22, Child: 36.

(exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 31
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (4 0)) ((3 2) (0 1)) ((4 1) (3 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0)
  (operation encryption-test (added-listener (exp (gen) (mul x x-0)))
    (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0))
      (exp (gen) (mul x x-0))) (3 1))
  (label 31)
  (parent 22)
  (unrealized (2 0) (4 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 32, Parent: 24, Child: 37.

(exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 32
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (4 0)) ((3 2) (0 1)) ((4 1) (3 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0)
  (operation encryption-test (added-listener (exp (gen) (mul x x-0)))
    (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0))
      (exp (gen) (mul x x-0))) (3 1))
  (label 32)
  (parent 24)
  (unrealized (2 0) (4 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 33, Parent: 25, Child: 38.

(exp (gen) (mul x x-1)) (exp (gen) (mul x x-1)) (enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x x-1)))) (exp (gen) x-1) (exp (gen) x-0) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (exp (gen) (mul x x-1)) (exp (gen) (mul x x-1)) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk a)) (exp (gen) (mul x x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-1)) init ((x x-0)) init ((a a) (b b) (h (exp (gen) x-1)) (x x)) init station-to-station 33
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-1)) (x x))
  (deflistener (exp (gen) (mul x x-1)))
  (deflistener (cat (exp (gen) x-0) (mul x (rec x-0) x-1)))
  (defstrand init 1 (x x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-1))
  (deflistener (exp (gen) (mul x x-1)))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 0) (2 0)) ((4 0) (5 0)) ((4 2) (0 1))
    ((5 1) (4 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x x-0 x-1)
  (operation encryption-test (added-listener (exp (gen) (mul x x-1)))
    (enc (enc (exp (gen) x) (exp (gen) x-1) (privk b-0))
      (exp (gen) (mul x x-1))) (4 1))
  (label 33)
  (parent 25)
  (unrealized (1 0) (2 0) (5 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 34, Parent: 27, Child: 39.

(exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x (rec y) x-0)) (cat (exp (gen) y) (mul x (rec y) x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 34
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x y x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x (rec y) x-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 0) (2 0)) ((4 0) (5 0)) ((4 2) (0 1))
    ((5 1) (4 1)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y x-0)
  (operation encryption-test (added-listener (exp (gen) (mul x x-0)))
    (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1))
      (exp (gen) (mul x x-0))) (4 1))
  (label 34)
  (parent 27)
  (unrealized (1 0) (2 0) (5 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 35, Parent: 30, Children: 40 41 42 43 44.

(cat (exp (gen) (mul x x-0 (rec w))) w) (cat (exp (gen) (mul x x-0 (rec w))) w) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 35
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn) (w expr))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) (mul x x-0 (rec w))) w))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test
    (added-listener (cat (exp (gen) (mul x x-0 (rec w))) w))
    (exp (gen) (mul x x-0)) (4 0))
  (label 35)
  (parent 30)
  (unrealized (1 0) (2 0) (5 0))
  (comment "5 in cohort - 5 not yet seen"))

Item 36, Parent: 31, Children: 45 46 47 48 49.

(cat (exp (gen) (mul x x-0 (rec w))) w) (cat (exp (gen) (mul x x-0 (rec w))) w) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 36
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn) (w expr))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) (mul x x-0 (rec w))) w))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test
    (added-listener (cat (exp (gen) (mul x x-0 (rec w))) w))
    (exp (gen) (mul x x-0)) (4 0))
  (label 36)
  (parent 31)
  (unrealized (2 0) (5 0))
  (comment "5 in cohort - 5 not yet seen"))

Item 37, Parent: 32, Children: 50 51 52 53 54.

(cat (exp (gen) (mul x x-0 (rec w))) w) (cat (exp (gen) (mul x x-0 (rec w))) w) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 37
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn) (w expr))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) (mul x x-0 (rec w))) w))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test
    (added-listener (cat (exp (gen) (mul x x-0 (rec w))) w))
    (exp (gen) (mul x x-0)) (4 0))
  (label 37)
  (parent 32)
  (unrealized (2 0) (5 0))
  (comment "5 in cohort - 5 not yet seen"))

Item 38, Parent: 33, Children: 55 56 57 58 59 60.

(cat (exp (gen) (mul x x-1 (rec w))) w) (cat (exp (gen) (mul x x-1 (rec w))) w) (exp (gen) (mul x x-1)) (exp (gen) (mul x x-1)) (enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x x-1)))) (exp (gen) x-1) (exp (gen) x-0) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (exp (gen) (mul x x-1)) (exp (gen) (mul x x-1)) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk a)) (exp (gen) (mul x x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-1)) init ((x x-0)) init ((a a) (b b) (h (exp (gen) x-1)) (x x)) init station-to-station 38
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn) (w expr))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-1)) (x x))
  (deflistener (exp (gen) (mul x x-1)))
  (deflistener (cat (exp (gen) x-0) (mul x (rec x-0) x-1)))
  (defstrand init 1 (x x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-1))
  (deflistener (exp (gen) (mul x x-1)))
  (deflistener (cat (exp (gen) (mul x x-1 (rec w))) w))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test
    (added-listener (cat (exp (gen) (mul x x-1 (rec w))) w))
    (exp (gen) (mul x x-1)) (5 0))
  (label 38)
  (parent 33)
  (unrealized (1 0) (2 0) (6 0))
  (comment "6 in cohort - 6 not yet seen"))

Item 39, Parent: 34, Children: 61 62 63 64 65 66.

(cat (exp (gen) (mul x x-0 (rec w))) w) (cat (exp (gen) (mul x x-0 (rec w))) w) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x (rec y) x-0)) (cat (exp (gen) y) (mul x (rec y) x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 39
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x y x-0 expn) (w expr))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x (rec y) x-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) (mul x x-0 (rec w))) w))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x y x-0)
  (operation nonce-test
    (added-listener (cat (exp (gen) (mul x x-0 (rec w))) w))
    (exp (gen) (mul x x-0)) (5 0))
  (label 39)
  (parent 34)
  (unrealized (1 0) (2 0) (6 0))
  (comment "6 in cohort - 6 not yet seen"))

Item 40, Parent: 35.

(cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 40
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (contracted (x-1 x) (x-2 x-0) (w (mul x x-0)))
    (gen) (5 0))
  (label 40)
  (parent 35)
  (unrealized (1 0) (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 41, Parent: 35.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) ((a b) (b b-0) (h (exp (gen) x-0)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (x x-0)) init station-to-station 41
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (displaced 6 0 init 1) (exp (gen) x-1) (5 0))
  (label 41)
  (parent 35)
  (unrealized (1 0) (2 0) (5 0))
  (comment "empty cohort"))

Item 42, Parent: 35.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 42
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (displaced 6 3 init 1) (exp (gen) x-1) (5 0))
  (label 42)
  (parent 35)
  (unrealized (1 0) (2 0) (5 0))
  (comment "empty cohort"))

Item 43, Parent: 35.

(exp (gen) x-1) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((x x-1)) init ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 43
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-1) (mul x x-0 (rec x-1))))
  (defstrand init 1 (x x-1))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)) ((6 0) (5 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test (added-strand init 1) (exp (gen) x-1) (5 0))
  (label 43)
  (parent 35)
  (unrealized (1 0) (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 44, Parent: 35.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-1)) (exp h y))) h (cat (exp (gen) y) (mul x x-0 (rec y))) (cat (exp (gen) y) (mul x x-0 (rec y))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((b b-1) (h h) (y y)) resp ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 44
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x x-0 y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x x-0 (rec y))))
  (defstrand resp 2 (b b-1) (h h) (y y))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)) ((6 1) (5 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0 y)
  (operation nonce-test (added-strand resp 2) (exp (gen) y) (5 0))
  (label 44)
  (parent 35)
  (unrealized (1 0) (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 45, Parent: 36.

(cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 45
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (contracted (x-1 x) (x-2 x-0) (w (mul x x-0)))
    (gen) (5 0))
  (label 45)
  (parent 36)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 46, Parent: 36.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) ((a b) (b b-0) (h (exp (gen) x-0)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (x x-0)) init station-to-station 46
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (displaced 6 0 init 1) (exp (gen) x-1) (5 0))
  (label 46)
  (parent 36)
  (unrealized (2 0) (5 0))
  (comment "empty cohort"))

Item 47, Parent: 36.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 47
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (displaced 6 3 init 1) (exp (gen) x-1) (5 0))
  (label 47)
  (parent 36)
  (unrealized (2 0) (5 0))
  (comment "empty cohort"))

Item 48, Parent: 36.

(exp (gen) x-1) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((x x-1)) init ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 48
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-1) (mul x x-0 (rec x-1))))
  (defstrand init 1 (x x-1))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)) ((6 0) (5 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test (added-strand init 1) (exp (gen) x-1) (5 0))
  (label 48)
  (parent 36)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 49, Parent: 36.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-1)) (exp h y))) h (cat (exp (gen) y) (mul x x-0 (rec y))) (cat (exp (gen) y) (mul x x-0 (rec y))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((b b-1) (h h) (y y)) resp ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 49
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x x-0 y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x x-0 (rec y))))
  (defstrand resp 2 (b b-1) (h h) (y y))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)) ((6 1) (5 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0 y)
  (operation nonce-test (added-strand resp 2) (exp (gen) y) (5 0))
  (label 49)
  (parent 36)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 50, Parent: 37.

(cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 50
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (contracted (x-1 x) (x-2 x-0) (w (mul x x-0)))
    (gen) (5 0))
  (label 50)
  (parent 37)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 51, Parent: 37.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) ((a b) (b b-0) (h (exp (gen) x-0)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (x x-0)) init station-to-station 51
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (displaced 6 0 init 1) (exp (gen) x-1) (5 0))
  (label 51)
  (parent 37)
  (unrealized (2 0) (5 0))
  (comment "empty cohort"))

Item 52, Parent: 37.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 52
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0)
  (operation nonce-test (displaced 6 3 init 1) (exp (gen) x-1) (5 0))
  (label 52)
  (parent 37)
  (unrealized (2 0) (5 0))
  (comment "empty cohort"))

Item 53, Parent: 37.

(exp (gen) x-1) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((x x-1)) init ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 53
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-1) (mul x x-0 (rec x-1))))
  (defstrand init 1 (x x-1))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)) ((6 0) (5 0)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test (added-strand init 1) (exp (gen) x-1) (5 0))
  (label 53)
  (parent 37)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 54, Parent: 37.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-1)) (exp h y))) h (cat (exp (gen) y) (mul x x-0 (rec y))) (cat (exp (gen) y) (mul x x-0 (rec y))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((b b-1) (h h) (y y)) resp ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 54
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x x-0 y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x x-0 (rec y))))
  (defstrand resp 2 (b b-1) (h h) (y y))
  (precedes ((0 0) (2 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (5 0)) ((3 2) (0 1)) ((4 1) (3 1))
    ((5 1) (4 0)) ((6 1) (5 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x x-0 y)
  (operation nonce-test (added-strand resp 2) (exp (gen) y) (5 0))
  (label 54)
  (parent 37)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 55, Parent: 38.

(cat (gen) (mul x-0 x-1)) (cat (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-1) (exp (gen) x) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk a)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-0) ((a b) (b b-0) (h (exp (gen) x-0)) (x x-1)) init ((x x)) init ((a a) (b b) (h (exp (gen) x-1)) (x x-0)) init station-to-station 55
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-1)) (x x-0))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) x) (mul (rec x) x-0 x-1)))
  (defstrand init 1 (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-0)) (x x-1))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (gen) (mul x-0 x-1)))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test
    (contracted (x-2 x-0) (x-3 x-1) (w (mul x-0 x-1))) (gen) (6 0))
  (label 55)
  (parent 38)
  (unrealized (1 0) (2 0) (5 0) (6 0))
  (comment "empty cohort"))

Item 56, Parent: 38.

(cat (exp (gen) x-1) x-0) (cat (exp (gen) x-1) x-0) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk b)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-0) (exp (gen) x) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk a)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk b)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-1) ((a b) (b b-0) (h (exp (gen) x-1)) (x x-0)) init ((x x)) init ((a a) (b b) (h (exp (gen) x-0)) (x x-1)) init station-to-station 56
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x-1))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) x) (mul (rec x) x-0 x-1)))
  (defstrand init 1 (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-1)) (x x-0))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) x-1) x-0))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test (displaced 7 0 init 1) (exp (gen) x-2) (6 0))
  (label 56)
  (parent 38)
  (unrealized (1 0) (2 0) (6 0))
  (comment "empty cohort"))

Item 57, Parent: 38.

(cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (exp (gen) x-1) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) init ((x x-1)) init ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 57
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-1) (mul x x-0 (rec x-1))))
  (defstrand init 1 (x x-1))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-1) (mul x x-0 (rec x-1))))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 0) (6 0)) ((4 0) (2 0)) ((4 0) (6 0))
    ((4 2) (0 1)) ((5 1) (4 1)) ((6 1) (5 0)))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test (displaced 7 3 init 1) (exp (gen) x-2) (6 0))
  (label 57)
  (parent 38)
  (unrealized (1 0) (2 0) (5 0) (6 0))
  (comment "empty cohort"))

Item 58, Parent: 38.

(cat (exp (gen) x-1) x-0) (cat (exp (gen) x-1) x-0) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-1) (exp (gen) x) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk a)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-0) ((a b) (b b-0) (h (exp (gen) x-0)) (x x-1)) init ((x x)) init ((a a) (b b) (h (exp (gen) x-1)) (x x-0)) init station-to-station 58
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-1)) (x x-0))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) x) (mul (rec x) x-0 x-1)))
  (defstrand init 1 (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-0)) (x x-1))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) x-1) x-0))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x x-0 x-1)
  (operation nonce-test (displaced 7 4 init 1) (exp (gen) x-2) (6 0))
  (label 58)
  (parent 38)
  (unrealized (1 0) (2 0) (6 0))
  (comment "empty cohort"))

Item 59, Parent: 38.

(exp (gen) x-2) (cat (exp (gen) x-2) (mul x-0 x-1 (rec x-2))) (cat (exp (gen) x-2) (mul x-0 x-1 (rec x-2))) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-1) (exp (gen) x) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk a)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-0) ((x x-2)) init ((a b) (b b-0) (h (exp (gen) x-0)) (x x-1)) init ((x x)) init ((a a) (b b) (h (exp (gen) x-1)) (x x-0)) init station-to-station 59
(defskeleton station-to-station
  (vars (a b b-0 name) (x x-0 x-1 x-2 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-1)) (x x-0))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) x) (mul (rec x) x-0 x-1)))
  (defstrand init 1 (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-0)) (x x-1))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) x-2) (mul x-0 x-1 (rec x-2))))
  (defstrand init 1 (x x-2))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)) ((7 0) (6 0)))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x x-0 x-1 x-2)
  (operation nonce-test (added-strand init 1) (exp (gen) x-2) (6 0))
  (label 59)
  (parent 38)
  (unrealized (1 0) (2 0) (5 0) (6 0))
  (comment "empty cohort"))

Item 60, Parent: 38.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-1)) (exp h y))) h (cat (exp (gen) y) (mul x-0 x-1 (rec y))) (cat (exp (gen) y) (mul x-0 x-1 (rec y))) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-1) (exp (gen) x) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (cat (exp (gen) x) (mul (rec x) x-0 x-1)) (exp (gen) (mul x-0 x-1)) (exp (gen) (mul x-0 x-1)) (enc (enc (exp (gen) x-0) (exp (gen) x-1) (privk a)) (exp (gen) (mul x-0 x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x-0) (privk b)) (exp (gen) (mul x-0 x-1)))) (exp (gen) x-0) ((b b-1) (h h) (y y)) resp ((a b) (b b-0) (h (exp (gen) x-0)) (x x-1)) init ((x x)) init ((a a) (b b) (h (exp (gen) x-1)) (x x-0)) init station-to-station 60
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x x-0 x-1 y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-1)) (x x-0))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) x) (mul (rec x) x-0 x-1)))
  (defstrand init 1 (x x))
  (defstrand init 3 (a b) (b b-0) (h (exp (gen) x-0)) (x x-1))
  (deflistener (exp (gen) (mul x-0 x-1)))
  (deflistener (cat (exp (gen) y) (mul x-0 x-1 (rec y))))
  (defstrand resp 2 (b b-1) (h h) (y y))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)) ((7 1) (6 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x x-0 x-1 y)
  (operation nonce-test (added-strand resp 2) (exp (gen) y) (6 0))
  (label 60)
  (parent 38)
  (unrealized (1 0) (2 0) (5 0) (6 0))
  (comment "empty cohort"))

Item 61, Parent: 39.

(cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul (rec y) x x-0)) (cat (exp (gen) y) (mul (rec y) x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 61
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (y x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul (rec y) x x-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen y x x-0)
  (operation nonce-test (contracted (x-1 x) (x-2 x-0) (w (mul x x-0)))
    (gen) (6 0))
  (label 61)
  (parent 39)
  (unrealized (1 0) (2 0) (5 0) (6 0))
  (comment "empty cohort"))

Item 62, Parent: 39.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul (rec y) x x-0)) (cat (exp (gen) y) (mul (rec y) x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) ((a b) (b b-1) (h (exp (gen) x-0)) (x x)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x)) (x x-0)) init station-to-station 62
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (y x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul (rec y) x x-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen y x x-0)
  (operation nonce-test (displaced 7 0 init 1) (exp (gen) x-1) (6 0))
  (label 62)
  (parent 39)
  (unrealized (1 0) (2 0) (6 0))
  (comment "empty cohort"))

Item 63, Parent: 39.

(cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul (rec y) x x-0)) (cat (exp (gen) y) (mul (rec y) x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 63
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (y x x-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul (rec y) x x-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen y x x-0)
  (operation nonce-test (displaced 7 4 init 1) (exp (gen) x-1) (6 0))
  (label 63)
  (parent 39)
  (unrealized (1 0) (2 0) (6 0))
  (comment "empty cohort"))

Item 64, Parent: 39.

(exp (gen) x-1) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (cat (exp (gen) x-1) (mul x x-0 (rec x-1))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul (rec y) x x-0)) (cat (exp (gen) y) (mul (rec y) x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((x x-1)) init ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 64
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (y x x-0 x-1 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul (rec y) x x-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-1) (mul x x-0 (rec x-1))))
  (defstrand init 1 (x x-1))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)) ((7 0) (6 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen y x x-0 x-1)
  (operation nonce-test (added-strand init 1) (exp (gen) x-1) (6 0))
  (label 64)
  (parent 39)
  (unrealized (1 0) (2 0) (5 0) (6 0))
  (comment "empty cohort"))

Item 65, Parent: 39.

(cat (exp (gen) y) (mul x x-0 (rec y))) (cat (exp (gen) y) (mul x x-0 (rec y))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x x-0 (rec y))) (cat (exp (gen) y) (mul x x-0 (rec y))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 65
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (x x-0 y expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x x-0 (rec y))))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x x-0 (rec y))))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((3 1) (6 0)) ((4 0) (2 0)) ((4 0) (6 0))
    ((4 2) (0 1)) ((5 1) (4 1)) ((6 1) (5 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen x x-0 y)
  (operation nonce-test (displaced 7 3 resp 2) (exp (gen) y-0) (6 0))
  (label 65)
  (parent 39)
  (unrealized (1 0) (2 0) (5 0) (6 0))
  (comment "empty cohort"))

Item 66, Parent: 39.

(cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) h-0 (privk b-2)) (exp h-0 y-0))) h-0 (cat (exp (gen) y-0) (mul x x-0 (rec y-0))) (cat (exp (gen) y-0) (mul x x-0 (rec y-0))) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul (rec y) x x-0)) (cat (exp (gen) y) (mul (rec y) x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((b b-2) (h h-0) (y y-0)) resp ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) init ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) init station-to-station 66
(defskeleton station-to-station
  (vars (a b b-0 b-1 b-2 name) (h h-0 base) (y x x-0 y-0 expn))
  (defstrand init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul (rec y) x x-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (defstrand init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y-0) (mul x x-0 (rec y-0))))
  (defstrand resp 2 (b b-2) (h h-0) (y y-0))
  (precedes ((0 0) (2 0)) ((0 0) (6 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 0) (2 0)) ((4 0) (6 0)) ((4 2) (0 1))
    ((5 1) (4 1)) ((6 1) (5 0)) ((7 1) (6 0)))
  (absent (y-0 h-0) (y h))
  (non-orig (privk a) (privk b))
  (precur (6 0) (2 0))
  (uniq-gen y x x-0 y-0)
  (operation nonce-test (added-strand resp 2) (exp (gen) y-0) (6 0))
  (label 66)
  (parent 39)
  (unrealized (1 0) (2 0) (5 0) (6 0))
  (comment "empty cohort"))

Tree 67.

87 78 95 94 93 92 91 90 89 88 86 77 85 76 84 75 73 72 69 83 82 81 80 79 74 71 70 68 67
(defprotocol station-to-station diffie-hellman
  (defrole init
    (vars (x expn) (h base) (a b name))
    (trace (send (exp (gen) x))
      (recv (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))))
      (send (enc (enc (exp (gen) x) h (privk a)) (exp h x))))
    (uniq-gen x))
  (defrole resp
    (vars (y expn) (h base) (a b name))
    (trace (recv h)
      (send
        (cat (exp (gen) y)
          (enc (enc (exp (gen) y) h (privk b)) (exp h y))))
      (recv (enc (enc h (exp (gen) y) (privk a)) (exp h y))))
    (uniq-gen y)
    (absent (y h))))

Item 67, Children: 68 69.

(enc (enc h (exp (gen) y) (privk a)) (exp h y)) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b)) (exp h y))) h ((a a) (b b) (h h) (y y)) resp station-to-station 67
(defskeleton station-to-station
  (vars (a b name) (h base) (y expn))
  (defstrand resp 3 (a a) (b b) (h h) (y y))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (label 67)
  (unrealized (0 2))
  (origs)
  (comment "2 in cohort - 2 not yet seen"))

Item 68, Parent: 67, Children: 70 71.

(enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 68
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (precedes ((0 1) (1 1)) ((1 0) (0 0)) ((1 2) (0 2)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (uniq-gen y x)
  (operation encryption-test (added-strand init 3)
    (enc (enc (exp (gen) x) (exp (gen) y) (privk a))
      (exp (gen) (mul y x))) (0 2))
  (label 68)
  (parent 67)
  (unrealized (1 1))
  (comment "2 in cohort - 2 not yet seen"))

Item 69, Parent: 67, Children: 72 73.

(exp h y) (exp h y) (enc (enc h (exp (gen) y) (privk a)) (exp h y)) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b)) (exp h y))) h ((a a) (b b) (h h) (y y)) resp station-to-station 69
(defskeleton station-to-station
  (vars (a b name) (h base) (y expn))
  (defstrand resp 3 (a a) (b b) (h h) (y y))
  (deflistener (exp h y))
  (precedes ((0 1) (1 0)) ((1 1) (0 2)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (operation encryption-test (added-listener (exp h y))
    (enc (enc h (exp (gen) y) (privk a)) (exp h y)) (0 2))
  (label 69)
  (parent 67)
  (unrealized (0 2) (1 0))
  (comment "2 in cohort - 2 not yet seen"))

Item 70, Parent: 68.

(enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((a a) (b b) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 70 (realized)
(defskeleton station-to-station
  (vars (a b name) (x y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (precedes ((0 1) (1 1)) ((1 0) (0 0)) ((1 2) (0 2)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (uniq-gen x y)
  (operation encryption-test (displaced 2 0 resp 2)
    (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0))
      (exp (gen) (mul x y))) (1 1))
  (label 70)
  (parent 68)
  (unrealized)
  (shape)
  (maps ((0) ((a a) (b b) (y y) (h (exp (gen) x)))))
  (origs))

Item 71, Parent: 68, Child: 74.

(exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 71
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (precedes ((0 1) (2 0)) ((1 0) (0 0)) ((1 2) (0 2)) ((2 1) (1 1)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (uniq-gen y x)
  (operation encryption-test (added-listener (exp (gen) (mul y x)))
    (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0))
      (exp (gen) (mul y x))) (1 1))
  (label 71)
  (parent 68)
  (unrealized (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 72, Parent: 69.

(exp (gen) y) (exp (gen) y) (enc (enc (gen) (exp (gen) y) (privk a)) (exp (gen) y)) (cat (exp (gen) y) (enc (enc (exp (gen) y) (gen) (privk b)) (exp (gen) y))) (gen) ((a a) (b b) (h (gen)) (y y)) resp station-to-station 72
(defskeleton station-to-station
  (vars (a b name) (y expn))
  (defstrand resp 3 (a a) (b b) (h (gen)) (y y))
  (deflistener (exp (gen) y))
  (precedes ((0 1) (1 0)) ((1 1) (0 2)))
  (absent (y (gen)))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (operation nonce-test (displaced 2 0 resp 2) (exp (gen) y-0) (1 0))
  (label 72)
  (parent 69)
  (unrealized (0 2))
  (comment "empty cohort"))

Item 73, Parent: 69, Children: 75 76 77 78.

(cat (exp h (mul y (rec w))) w) (cat (exp h (mul y (rec w))) w) (exp h y) (exp h y) (enc (enc h (exp (gen) y) (privk a)) (exp h y)) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b)) (exp h y))) h ((a a) (b b) (h h) (y y)) resp station-to-station 73
(defskeleton station-to-station
  (vars (a b name) (h base) (y expn) (w expr))
  (defstrand resp 3 (a a) (b b) (h h) (y y))
  (deflistener (exp h y))
  (deflistener (cat (exp h (mul y (rec w))) w))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (precur (2 0))
  (operation nonce-test (added-listener (cat (exp h (mul y (rec w))) w))
    (exp h y) (1 0))
  (label 73)
  (parent 69)
  (unrealized (0 2) (2 0))
  (comment "4 in cohort - 4 not yet seen"))

Item 74, Parent: 71, Children: 79 80 81 82 83.

(cat (exp (gen) (mul y x (rec w))) w) (cat (exp (gen) (mul y x (rec w))) w) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 74
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn) (w expr))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) (mul y x (rec w))) w))
  (precedes ((0 1) (3 0)) ((1 0) (0 0)) ((1 2) (0 2)) ((2 1) (1 1))
    ((3 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (uniq-gen y x)
  (precur (3 0))
  (operation nonce-test
    (added-listener (cat (exp (gen) (mul y x (rec w))) w))
    (exp (gen) (mul y x)) (2 0))
  (label 74)
  (parent 71)
  (unrealized (3 0))
  (comment "5 in cohort - 5 not yet seen"))

Item 75, Parent: 73, Child: 84.

(cat (gen) (mul w y)) (cat (gen) (mul w y)) (exp (gen) (mul w y)) (exp (gen) (mul w y)) (enc (enc (exp (gen) w) (exp (gen) y) (privk a)) (exp (gen) (mul w y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) w) (privk b)) (exp (gen) (mul w y)))) (exp (gen) w) ((a a) (b b) (h (exp (gen) w)) (y y)) resp station-to-station 75
(defskeleton station-to-station
  (vars (a b name) (w expr) (y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) w)) (y y))
  (deflistener (exp (gen) (mul w y)))
  (deflistener (cat (gen) (mul w y)))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)))
  (absent (y (exp (gen) w)))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (precur (2 0))
  (operation nonce-test
    (contracted (y-0 y) (h (exp (gen) w)) (w (mul w y))) (gen) (2 0))
  (label 75)
  (parent 73)
  (unrealized (0 2) (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 76, Parent: 73, Child: 85.

(exp (gen) x) (cat (exp (gen) x) (mul w y)) (cat (exp (gen) x) (mul w y)) (exp (gen) (mul w x y)) (exp (gen) (mul w x y)) (enc (enc (exp (gen) (mul w x)) (exp (gen) y) (privk a)) (exp (gen) (mul w x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) (mul w x)) (privk b)) (exp (gen) (mul w x y)))) (exp (gen) (mul w x)) ((x x)) init ((a a) (b b) (h (exp (gen) (mul w x))) (y y)) resp station-to-station 76
(defskeleton station-to-station
  (vars (a b name) (w expr) (x y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) (mul w x))) (y y))
  (deflistener (exp (gen) (mul w x y)))
  (deflistener (cat (exp (gen) x) (mul w y)))
  (defstrand init 1 (x x))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 0) (0 0)))
  (absent (y (exp (gen) (mul w x))))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y)
  (operation nonce-test (added-strand init 1) (exp (gen) x) (2 0))
  (label 76)
  (parent 73)
  (unrealized (0 2) (1 0) (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 77, Parent: 73, Child: 86.

(cat (exp (gen) y) w) (cat (exp (gen) y) w) (exp (gen) (mul w y)) (exp (gen) (mul w y)) (enc (enc (exp (gen) w) (exp (gen) y) (privk a)) (exp (gen) (mul w y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) w) (privk b)) (exp (gen) (mul w y)))) (exp (gen) w) ((a a) (b b) (h (exp (gen) w)) (y y)) resp station-to-station 77
(defskeleton station-to-station
  (vars (a b name) (w expr) (y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) w)) (y y))
  (deflistener (exp (gen) (mul w y)))
  (deflistener (cat (exp (gen) y) w))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)))
  (absent (y (exp (gen) w)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y)
  (operation nonce-test (displaced 3 0 resp 2) (exp (gen) y-0) (2 0))
  (label 77)
  (parent 73)
  (unrealized (0 2))
  (comment "1 in cohort - 1 not yet seen"))

Item 78, Parent: 73, Child: 87.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul w y-0)) (cat (exp (gen) y) (mul w y-0)) (exp (gen) (mul w y y-0)) (exp (gen) (mul w y y-0)) (enc (enc (exp (gen) (mul w y)) (exp (gen) y-0) (privk a)) (exp (gen) (mul w y y-0))) (cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) (mul w y)) (privk b)) (exp (gen) (mul w y y-0)))) (exp (gen) (mul w y)) ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) (mul w y))) (y y-0)) resp station-to-station 78
(defskeleton station-to-station
  (vars (a b b-0 name) (h base) (w expr) (y y-0 expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) (mul w y))) (y y-0))
  (deflistener (exp (gen) (mul w y y-0)))
  (deflistener (cat (exp (gen) y) (mul w y-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 1) (0 0)))
  (absent (y h) (y-0 (exp (gen) (mul w y))))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y y-0)
  (operation nonce-test (added-strand resp 2) (exp (gen) y) (2 0))
  (label 78)
  (parent 73)
  (unrealized (0 2) (1 0) (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 79, Parent: 74.

(cat (gen) (mul y x)) (cat (gen) (mul y x)) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 79
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (gen) (mul y x)))
  (precedes ((0 1) (3 0)) ((1 0) (0 0)) ((1 2) (0 2)) ((2 1) (1 1))
    ((3 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (uniq-gen y x)
  (precur (3 0))
  (operation nonce-test (contracted (y-0 y) (x-0 x) (w (mul y x))) (gen)
    (3 0))
  (label 79)
  (parent 74)
  (unrealized (2 0) (3 0))
  (comment "empty cohort"))

Item 80, Parent: 74.

(cat (exp (gen) x) y) (cat (exp (gen) x) y) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 80
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) x) y))
  (precedes ((0 1) (3 0)) ((1 0) (0 0)) ((1 2) (0 2)) ((2 1) (1 1))
    ((3 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (3 0))
  (uniq-gen y x)
  (operation nonce-test (displaced 4 1 init 1) (exp (gen) x-0) (3 0))
  (label 80)
  (parent 74)
  (unrealized (3 0))
  (comment "empty cohort"))

Item 81, Parent: 74.

(exp (gen) x-0) (cat (exp (gen) x-0) (mul y x (rec x-0))) (cat (exp (gen) x-0) (mul y x (rec x-0))) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((x x-0)) init ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 81
(defskeleton station-to-station
  (vars (a b b-0 name) (y x x-0 expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) x-0) (mul y x (rec x-0))))
  (defstrand init 1 (x x-0))
  (precedes ((0 1) (3 0)) ((1 0) (0 0)) ((1 2) (0 2)) ((2 1) (1 1))
    ((3 1) (2 0)) ((4 0) (3 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (3 0))
  (uniq-gen y x x-0)
  (operation nonce-test (added-strand init 1) (exp (gen) x-0) (3 0))
  (label 81)
  (parent 74)
  (unrealized (2 0) (3 0))
  (comment "empty cohort"))

Item 82, Parent: 74.

(cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul x y)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 82
(defskeleton station-to-station
  (vars (a b b-0 name) (x y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) y) x))
  (precedes ((0 1) (3 0)) ((1 0) (0 0)) ((1 2) (0 2)) ((2 1) (1 1))
    ((3 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (3 0))
  (uniq-gen x y)
  (operation nonce-test (displaced 4 0 resp 2) (exp (gen) y-0) (3 0))
  (label 82)
  (parent 74)
  (unrealized (3 0))
  (comment "empty cohort"))

Item 83, Parent: 74.

(cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) h (privk b-1)) (exp h y-0))) h (cat (exp (gen) y-0) (mul y x (rec y-0))) (cat (exp (gen) y-0) (mul y x (rec y-0))) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((b b-1) (h h) (y y-0)) resp ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 83
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (y x y-0 expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y-0) (mul y x (rec y-0))))
  (defstrand resp 2 (b b-1) (h h) (y y-0))
  (precedes ((0 1) (3 0)) ((1 0) (0 0)) ((1 2) (0 2)) ((2 1) (1 1))
    ((3 1) (2 0)) ((4 1) (3 0)))
  (absent (y-0 h) (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (3 0))
  (uniq-gen y x y-0)
  (operation nonce-test (added-strand resp 2) (exp (gen) y-0) (3 0))
  (label 83)
  (parent 74)
  (unrealized (2 0) (3 0))
  (comment "empty cohort"))

Item 84, Parent: 75.

y y (cat (gen) (mul w y)) (cat (gen) (mul w y)) (exp (gen) (mul w y)) (exp (gen) (mul w y)) (enc (enc (exp (gen) w) (exp (gen) y) (privk a)) (exp (gen) (mul w y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) w) (privk b)) (exp (gen) (mul w y)))) (exp (gen) w) ((a a) (b b) (h (exp (gen) w)) (y y)) resp station-to-station 84
(defskeleton station-to-station
  (vars (a b name) (w expr) (y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) w)) (y y))
  (deflistener (exp (gen) (mul w y)))
  (deflistener (cat (gen) (mul w y)))
  (deflistener y)
  (precedes ((0 1) (3 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y (exp (gen) w)))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (precur (2 0))
  (operation nonce-test (added-listener y) (mul w y) (2 0))
  (label 84)
  (parent 75)
  (unrealized (0 2) (3 0))
  (comment "empty cohort"))

Item 85, Parent: 76.

y y (exp (gen) x) (cat (exp (gen) x) (mul w y)) (cat (exp (gen) x) (mul w y)) (exp (gen) (mul w x y)) (exp (gen) (mul w x y)) (enc (enc (exp (gen) (mul w x)) (exp (gen) y) (privk a)) (exp (gen) (mul w x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) (mul w x)) (privk b)) (exp (gen) (mul w x y)))) (exp (gen) (mul w x)) ((x x)) init ((a a) (b b) (h (exp (gen) (mul w x))) (y y)) resp station-to-station 85
(defskeleton station-to-station
  (vars (a b name) (w expr) (x y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) (mul w x))) (y y))
  (deflistener (exp (gen) (mul w x y)))
  (deflistener (cat (exp (gen) x) (mul w y)))
  (defstrand init 1 (x x))
  (deflistener y)
  (precedes ((0 1) (4 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 0) (0 0))
    ((4 1) (2 0)))
  (absent (y (exp (gen) (mul w x))))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y)
  (operation nonce-test (added-listener y) (mul w y) (2 0))
  (label 85)
  (parent 76)
  (unrealized (0 2) (4 0))
  (comment "empty cohort"))

Item 86, Parent: 77, Children: 88 89.

(enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 86
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (precedes ((0 1) (2 0)) ((0 1) (3 1)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y x)
  (operation encryption-test (added-strand init 3)
    (enc (exp (gen) x) (exp (gen) y) (privk a)) (0 2))
  (label 86)
  (parent 77)
  (unrealized (2 0) (3 1))
  (comment "2 in cohort - 2 not yet seen"))

Item 87, Parent: 78.

y-0 y-0 (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul w y-0)) (cat (exp (gen) y) (mul w y-0)) (exp (gen) (mul w y y-0)) (exp (gen) (mul w y y-0)) (enc (enc (exp (gen) (mul w y)) (exp (gen) y-0) (privk a)) (exp (gen) (mul w y y-0))) (cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) (mul w y)) (privk b)) (exp (gen) (mul w y y-0)))) (exp (gen) (mul w y)) ((b b-0) (h h) (y y)) resp ((a a) (b b) (h (exp (gen) (mul w y))) (y y-0)) resp station-to-station 87
(defskeleton station-to-station
  (vars (a b b-0 name) (h base) (w expr) (y y-0 expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) (mul w y))) (y y-0))
  (deflistener (exp (gen) (mul w y y-0)))
  (deflistener (cat (exp (gen) y) (mul w y-0)))
  (defstrand resp 2 (b b-0) (h h) (y y))
  (deflistener y-0)
  (precedes ((0 1) (4 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 1) (0 0))
    ((4 1) (2 0)))
  (absent (y h) (y-0 (exp (gen) (mul w y))))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y y-0)
  (operation nonce-test (added-listener y-0) (mul w y-0) (2 0))
  (label 87)
  (parent 78)
  (unrealized (0 2) (4 0))
  (comment "empty cohort"))

Item 88, Parent: 86.

(enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((a a) (b b) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 88
(defskeleton station-to-station
  (vars (a b name) (x y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (precedes ((0 1) (2 0)) ((0 1) (3 1)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x y)
  (operation encryption-test (displaced 4 0 resp 2)
    (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0))
      (exp (gen) (mul x y))) (3 1))
  (label 88)
  (parent 86)
  (unrealized (2 0))
  (comment "empty cohort"))

Item 89, Parent: 86, Child: 90.

(exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 89
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (precedes ((0 1) (2 0)) ((0 1) (4 0)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)) ((4 1) (3 1)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y x)
  (operation encryption-test (added-listener (exp (gen) (mul y x)))
    (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0))
      (exp (gen) (mul y x))) (3 1))
  (label 89)
  (parent 86)
  (unrealized (2 0) (4 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 90, Parent: 89, Children: 91 92 93 94 95.

(cat (exp (gen) (mul y x (rec w))) w) (cat (exp (gen) (mul y x (rec w))) w) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 90
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn) (w expr))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) (mul y x (rec w))) w))
  (precedes ((0 1) (2 0)) ((0 1) (5 0)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)) ((4 1) (3 1)) ((5 1) (4 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen y x)
  (operation nonce-test
    (added-listener (cat (exp (gen) (mul y x (rec w))) w))
    (exp (gen) (mul y x)) (4 0))
  (label 90)
  (parent 89)
  (unrealized (2 0) (5 0))
  (comment "5 in cohort - 5 not yet seen"))

Item 91, Parent: 90.

(cat (gen) (mul y x)) (cat (gen) (mul y x)) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 91
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (gen) (mul y x)))
  (precedes ((0 1) (2 0)) ((0 1) (5 0)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)) ((4 1) (3 1)) ((5 1) (4 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen y x)
  (operation nonce-test (contracted (y-0 y) (x-0 x) (w (mul y x))) (gen)
    (5 0))
  (label 91)
  (parent 90)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 92, Parent: 90.

(cat (exp (gen) x) y) (cat (exp (gen) x) y) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 92
(defskeleton station-to-station
  (vars (a b b-0 name) (y x expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) x) y))
  (precedes ((0 1) (2 0)) ((0 1) (5 0)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)) ((4 1) (3 1)) ((5 1) (4 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen y x)
  (operation nonce-test (displaced 6 3 init 1) (exp (gen) x-0) (5 0))
  (label 92)
  (parent 90)
  (unrealized (2 0) (5 0))
  (comment "empty cohort"))

Item 93, Parent: 90.

(exp (gen) x-0) (cat (exp (gen) x-0) (mul y x (rec x-0))) (cat (exp (gen) x-0) (mul y x (rec x-0))) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((x x-0)) init ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 93
(defskeleton station-to-station
  (vars (a b b-0 name) (y x x-0 expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) x-0) (mul y x (rec x-0))))
  (defstrand init 1 (x x-0))
  (precedes ((0 1) (2 0)) ((0 1) (5 0)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)) ((4 1) (3 1)) ((5 1) (4 0))
    ((6 0) (5 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen y x x-0)
  (operation nonce-test (added-strand init 1) (exp (gen) x-0) (5 0))
  (label 93)
  (parent 90)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Item 94, Parent: 90.

(cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 94
(defskeleton station-to-station
  (vars (a b b-0 name) (x y expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) y) x))
  (precedes ((0 1) (2 0)) ((0 1) (5 0)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)) ((4 1) (3 1)) ((5 1) (4 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen x y)
  (operation nonce-test (displaced 6 0 resp 2) (exp (gen) y-0) (5 0))
  (label 94)
  (parent 90)
  (unrealized (2 0) (5 0))
  (comment "empty cohort"))

Item 95, Parent: 90.

(cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) h (privk b-1)) (exp h y-0))) h (cat (exp (gen) y-0) (mul y x (rec y-0))) (cat (exp (gen) y-0) (mul y x (rec y-0))) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((b b-1) (h h) (y y-0)) resp ((a a) (b b-0) (h (exp (gen) y)) (x x)) init ((a a) (b b) (h (exp (gen) x)) (y y)) resp station-to-station 95
(defskeleton station-to-station
  (vars (a b b-0 b-1 name) (h base) (y x y-0 expn))
  (defstrand resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y-0) (mul y x (rec y-0))))
  (defstrand resp 2 (b b-1) (h h) (y y-0))
  (precedes ((0 1) (2 0)) ((0 1) (5 0)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 0) (0 0)) ((3 2) (0 2)) ((4 1) (3 1)) ((5 1) (4 0))
    ((6 1) (5 0)))
  (absent (y-0 h) (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (5 0) (2 0))
  (uniq-gen y x y-0)
  (operation nonce-test (added-strand resp 2) (exp (gen) y-0) (5 0))
  (label 95)
  (parent 90)
  (unrealized (2 0) (4 0) (5 0))
  (comment "empty cohort"))

Tree 96.

126 118 117 125 116 108 124 115 123 114 113 107 98 122 112 97 121 111 106 120 110 119 109 105 104 103 102 101 100 99 98 97 96
(defprotocol station-weak diffie-hellman
  (defrole weak-init
    (vars (x expn) (h base) (a b name))
    (trace (send (exp (gen) x))
      (recv (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))))
      (send (enc (enc (exp (gen) x) h (privk a)) (exp h x)))))
  (defrole weak-resp
    (vars (y expn) (h base) (a b name))
    (trace (recv h)
      (send
        (cat (exp (gen) y)
          (enc (enc (exp (gen) y) h (privk b)) (exp h y))))
      (recv (enc (enc h (exp (gen) y) (privk a)) (exp h y))))
    (absent (y h))))

Item 96, Children: 97 98 99.

(enc (enc (exp (gen) x) h (privk a)) (exp h x)) (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))) (exp (gen) x) ((a a) (b b) (h h) (x x)) weak-init station-weak 96
(defskeleton station-weak
  (vars (a b name) (h base) (x expn))
  (defstrand weak-init 3 (a a) (b b) (h h) (x x))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (label 96)
  (unrealized (0 1))
  (origs)
  (comment "3 in cohort - 3 not yet seen"))

Item 97, Parent: 96.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) weak-init ((a a) (b b) (h (exp (gen) x-0)) (x x)) weak-init station-weak 97 (realized)
(defskeleton station-weak
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (defstrand weak-init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (1 1)) ((1 2) (0 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-init 3)
    (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b))
      (exp (gen) (mul x x-0))) (0 1))
  (label 97)
  (parent 96)
  (unrealized)
  (shape)
  (maps ((0) ((a a) (b b) (x x) (h (exp (gen) x-0)))))
  (origs))

Item 98, Parent: 96.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) weak-resp ((a a) (b b) (h (exp (gen) y)) (x x)) weak-init station-weak 98 (realized)
(defskeleton station-weak
  (vars (a b name) (x y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-resp 2)
    (enc (enc (exp (gen) y) (exp (gen) x) (privk b))
      (exp (gen) (mul x y))) (0 1))
  (label 98)
  (parent 96)
  (unrealized)
  (shape)
  (maps ((0) ((a a) (b b) (x x) (h (exp (gen) y)))))
  (origs))

Item 99, Parent: 96, Children: 100 101 102 103 104.

(exp h x) (exp h x) (enc (enc (exp (gen) x) h (privk a)) (exp h x)) (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))) (exp (gen) x) ((a a) (b b) (h h) (x x)) weak-init station-weak 99
(defskeleton station-weak
  (vars (a b name) (h base) (x expn))
  (defstrand weak-init 3 (a a) (b b) (h h) (x x))
  (deflistener (exp h x))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation encryption-test (added-listener (exp h x))
    (enc (enc h (exp (gen) x) (privk b)) (exp h x)) (0 1))
  (label 99)
  (parent 96)
  (unrealized (0 1) (1 0))
  (comment "5 in cohort - 5 not yet seen"))

Item 100, Parent: 99.

(gen) (gen) (enc (enc (exp (gen) x) (exp (gen) (rec x)) (privk a)) (gen)) (cat (exp (gen) (rec x)) (enc (enc (exp (gen) (rec x)) (exp (gen) x) (privk b)) (gen))) (exp (gen) x) ((a a) (b b) (h (exp (gen) (rec x))) (x x)) weak-init station-weak 100
(defskeleton station-weak
  (vars (a b name) (x expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) (rec x))) (x x))
  (deflistener (gen))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation nonce-test (contracted (h (exp (gen) (rec x)))) (gen)
    (1 0))
  (label 100)
  (parent 99)
  (unrealized (0 1))
  (comment "empty cohort"))

Item 101, Parent: 99.

(exp (gen) x) (exp (gen) x) (enc (enc (exp (gen) x) (gen) (privk a)) (exp (gen) x)) (cat (gen) (enc (enc (gen) (exp (gen) x) (privk b)) (exp (gen) x))) (exp (gen) x) ((a a) (b b) (h (gen)) (x x)) weak-init station-weak 101
(defskeleton station-weak
  (vars (a b name) (x expn))
  (defstrand weak-init 3 (a a) (b b) (h (gen)) (x x))
  (deflistener (exp (gen) x))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation nonce-test (displaced 2 0 weak-init 1) (exp (gen) x-0)
    (1 0))
  (label 101)
  (parent 99)
  (unrealized (0 1))
  (comment "empty cohort"))

Item 102, Parent: 99.

(exp (gen) x-0) (exp (gen) x-0) (exp (gen) x-0) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) x-0)) (privk a)) (exp (gen) x-0)) (cat (exp (gen) (mul (rec x) x-0)) (enc (enc (exp (gen) (mul (rec x) x-0)) (exp (gen) x) (privk b)) (exp (gen) x-0))) (exp (gen) x) ((x x-0)) weak-init ((a a) (b b) (h (exp (gen) (mul (rec x) x-0))) (x x)) weak-init station-weak 102
(defskeleton station-weak
  (vars (a b name) (x x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) (mul (rec x) x-0)))
    (x x))
  (deflistener (exp (gen) x-0))
  (defstrand weak-init 1 (x x-0))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)) ((2 0) (1 0)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation nonce-test (added-strand weak-init 1) (exp (gen) x-0)
    (1 0))
  (label 102)
  (parent 99)
  (unrealized (0 1))
  (comment "empty cohort"))

Item 103, Parent: 99.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (exp (gen) y) (exp (gen) y) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) y)) (privk a)) (exp (gen) y)) (cat (exp (gen) (mul (rec x) y)) (enc (enc (exp (gen) (mul (rec x) y)) (exp (gen) x) (privk b)) (exp (gen) y))) (exp (gen) x) ((b b-0) (h h) (y y)) weak-resp ((a a) (b b) (h (exp (gen) (mul (rec x) y))) (x x)) weak-init station-weak 103
(defskeleton station-weak
  (vars (a b b-0 name) (h base) (x y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) (mul (rec x) y)))
    (x x))
  (deflistener (exp (gen) y))
  (defstrand weak-resp 2 (b b-0) (h h) (y y))
  (precedes ((0 0) (1 0)) ((1 1) (0 1)) ((2 1) (1 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (operation nonce-test (added-strand weak-resp 2) (exp (gen) y) (1 0))
  (label 103)
  (parent 99)
  (unrealized (0 1))
  (comment "empty cohort"))

Item 104, Parent: 99, Children: 105 106 107 108.

(cat (exp h (mul x (rec w))) w) (cat (exp h (mul x (rec w))) w) (exp h x) (exp h x) (enc (enc (exp (gen) x) h (privk a)) (exp h x)) (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))) (exp (gen) x) ((a a) (b b) (h h) (x x)) weak-init station-weak 104
(defskeleton station-weak
  (vars (a b name) (h base) (x expn) (w expr))
  (defstrand weak-init 3 (a a) (b b) (h h) (x x))
  (deflistener (exp h x))
  (deflistener (cat (exp h (mul x (rec w))) w))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (precur (2 0))
  (operation nonce-test (added-listener (cat (exp h (mul x (rec w))) w))
    (exp h x) (1 0))
  (label 104)
  (parent 99)
  (unrealized (0 1) (2 0))
  (comment "4 in cohort - 4 not yet seen"))

Item 105, Parent: 104, Children: 109 110.

(cat (gen) w) (cat (gen) w) (exp (gen) w) (exp (gen) w) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) w)) (privk a)) (exp (gen) w)) (cat (exp (gen) (mul (rec x) w)) (enc (enc (exp (gen) (mul (rec x) w)) (exp (gen) x) (privk b)) (exp (gen) w))) (exp (gen) x) ((a a) (b b) (h (exp (gen) (mul (rec x) w))) (x x)) weak-init station-weak 105
(defskeleton station-weak
  (vars (a b name) (x expn) (w expr))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) (mul (rec x) w)))
    (x x))
  (deflistener (exp (gen) w))
  (deflistener (cat (gen) w))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)))
  (non-orig (privk a) (privk b))
  (uniq-gen x)
  (precur (2 0))
  (operation nonce-test (contracted (h (exp (gen) (mul (rec x) w))))
    (gen) (2 0))
  (label 105)
  (parent 104)
  (unrealized (0 1))
  (comment "2 in cohort - 2 not yet seen"))

Item 106, Parent: 104, Children: 111 112.

(cat (exp (gen) x) w) (cat (exp (gen) x) w) (exp (gen) (mul w x)) (exp (gen) (mul w x)) (enc (enc (exp (gen) x) (exp (gen) w) (privk a)) (exp (gen) (mul w x))) (cat (exp (gen) w) (enc (enc (exp (gen) w) (exp (gen) x) (privk b)) (exp (gen) (mul w x)))) (exp (gen) x) ((a a) (b b) (h (exp (gen) w)) (x x)) weak-init station-weak 106
(defskeleton station-weak
  (vars (a b name) (w expr) (x expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) w)) (x x))
  (deflistener (exp (gen) (mul w x)))
  (deflistener (cat (exp (gen) x) w))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (displaced 3 0 weak-init 1) (exp (gen) x-0)
    (2 0))
  (label 106)
  (parent 104)
  (unrealized (0 1))
  (comment "2 in cohort - 2 not yet seen"))

Item 107, Parent: 104, Children: 113 114 115.

(exp (gen) x-0) (cat (exp (gen) x-0) w) (cat (exp (gen) x-0) w) (exp (gen) (mul w x-0)) (exp (gen) (mul w x-0)) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) w x-0)) (privk a)) (exp (gen) (mul w x-0))) (cat (exp (gen) (mul (rec x) w x-0)) (enc (enc (exp (gen) (mul (rec x) w x-0)) (exp (gen) x) (privk b)) (exp (gen) (mul w x-0)))) (exp (gen) x) ((x x-0)) weak-init ((a a) (b b) (h (exp (gen) (mul (rec x) w x-0))) (x x)) weak-init station-weak 107
(defskeleton station-weak
  (vars (a b name) (x expn) (w expr) (x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) (mul (rec x) w x-0)))
    (x x))
  (deflistener (exp (gen) (mul w x-0)))
  (deflistener (cat (exp (gen) x-0) w))
  (defstrand weak-init 1 (x x-0))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 0) (2 0)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (added-strand weak-init 1) (exp (gen) x-0)
    (2 0))
  (label 107)
  (parent 104)
  (unrealized (0 1))
  (comment "3 in cohort - 3 not yet seen"))

Item 108, Parent: 104, Children: 116 117 118.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) w) (cat (exp (gen) y) w) (exp (gen) (mul w y)) (exp (gen) (mul w y)) (enc (enc (exp (gen) x) (exp (gen) (mul (rec x) w y)) (privk a)) (exp (gen) (mul w y))) (cat (exp (gen) (mul (rec x) w y)) (enc (enc (exp (gen) (mul (rec x) w y)) (exp (gen) x) (privk b)) (exp (gen) (mul w y)))) (exp (gen) x) ((b b-0) (h h) (y y)) weak-resp ((a a) (b b) (h (exp (gen) (mul (rec x) w y))) (x x)) weak-init station-weak 108
(defskeleton station-weak
  (vars (a b b-0 name) (h base) (x expn) (w expr) (y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) (mul (rec x) w y)))
    (x x))
  (deflistener (exp (gen) (mul w y)))
  (deflistener (cat (exp (gen) y) w))
  (defstrand weak-resp 2 (b b-0) (h h) (y y))
  (precedes ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (added-strand weak-resp 2) (exp (gen) y) (2 0))
  (label 108)
  (parent 104)
  (unrealized (0 1))
  (comment "3 in cohort - 3 not yet seen"))

Item 109, Parent: 105, Child: 119.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) weak-init ((a a) (b b) (h (exp (gen) x-0)) (x x)) weak-init station-weak 109
(defskeleton station-weak
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand weak-init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (2 0)) ((0 0) (3 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-init 3)
    (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (0 1))
  (label 109)
  (parent 105)
  (unrealized (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 110, Parent: 105, Child: 120.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (gen) (mul x y)) (cat (gen) (mul x y)) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) weak-resp ((a a) (b b) (h (exp (gen) y)) (x x)) weak-init station-weak 110
(defskeleton station-weak
  (vars (a b name) (x y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (gen) (mul x y)))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (2 0)) ((0 0) (3 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (0 1)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-resp 2)
    (enc (exp (gen) y) (exp (gen) x) (privk b)) (0 1))
  (label 110)
  (parent 105)
  (unrealized (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 111, Parent: 106, Child: 121.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) weak-init ((a a) (b b) (h (exp (gen) x-0)) (x x)) weak-init station-weak 111 (realized)
(defskeleton station-weak
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand weak-init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (2 0)) ((0 0) (3 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-init 3)
    (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (0 1))
  (label 111)
  (parent 106)
  (unrealized)
  (comment "1 in cohort - 1 not yet seen"))

Item 112, Parent: 106, Child: 122.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (exp (gen) x) y) (cat (exp (gen) x) y) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) weak-resp ((a a) (b b) (h (exp (gen) y)) (x x)) weak-init station-weak 112 (realized)
(defskeleton station-weak
  (vars (a b name) (x y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) x) y))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (2 0)) ((0 0) (3 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (0 1)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-resp 2)
    (enc (exp (gen) y) (exp (gen) x) (privk b)) (0 1))
  (label 112)
  (parent 106)
  (unrealized)
  (comment "1 in cohort - 1 not yet seen"))

Item 113, Parent: 107.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x-0) x) (cat (exp (gen) x-0) x) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) weak-init ((a a) (b b) (h (exp (gen) x-0)) (x x)) weak-init station-weak 113
(defskeleton station-weak
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) x-0) x))
  (defstrand weak-init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (2 0)) ((0 0) (3 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((3 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (displaced 3 4 weak-init 3)
    (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (0 1))
  (label 113)
  (parent 107)
  (unrealized (2 0))
  (comment "empty cohort"))

Item 114, Parent: 107, Child: 123.

(enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x x-1)))) (exp (gen) x-1) (exp (gen) x-0) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (exp (gen) (mul x x-1)) (exp (gen) (mul x x-1)) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk a)) (exp (gen) (mul x x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-1)) weak-init ((x x-0)) weak-init ((a a) (b b) (h (exp (gen) x-1)) (x x)) weak-init station-weak 114
(defskeleton station-weak
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-1)) (x x))
  (deflistener (exp (gen) (mul x x-1)))
  (deflistener (cat (exp (gen) x-0) (mul x (rec x-0) x-1)))
  (defstrand weak-init 1 (x x-0))
  (defstrand weak-init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-1))
  (precedes ((0 0) (2 0)) ((0 0) (4 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-init 3)
    (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (0 1))
  (label 114)
  (parent 107)
  (unrealized (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 115, Parent: 107, Child: 124.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (exp (gen) x-0) (cat (exp (gen) x-0) (mul x (rec x-0) y)) (cat (exp (gen) x-0) (mul x (rec x-0) y)) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) weak-resp ((x x-0)) weak-init ((a a) (b b) (h (exp (gen) y)) (x x)) weak-init station-weak 115
(defskeleton station-weak
  (vars (a b name) (x x-0 y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) x-0) (mul x (rec x-0) y)))
  (defstrand weak-init 1 (x x-0))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (2 0)) ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 1) (0 1)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-resp 2)
    (enc (exp (gen) y) (exp (gen) x) (privk b)) (0 1))
  (label 115)
  (parent 107)
  (unrealized (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 116, Parent: 108, Child: 125.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x (rec y) x-0)) (cat (exp (gen) y) (mul x (rec y) x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) weak-init ((b b-0) (h h) (y y)) weak-resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) weak-init station-weak 116
(defskeleton station-weak
  (vars (a b b-0 b-1 name) (h base) (x y x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x (rec y) x-0)))
  (defstrand weak-resp 2 (b b-0) (h h) (y y))
  (defstrand weak-init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (2 0)) ((0 0) (4 1)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 2) (0 1)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-init 3)
    (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (0 1))
  (label 116)
  (parent 108)
  (unrealized (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 117, Parent: 108.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) weak-resp ((a a) (b b) (h (exp (gen) y)) (x x)) weak-init station-weak 117
(defskeleton station-weak
  (vars (a b name) (x y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (3 0)) ((1 1) (0 1)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (displaced 4 3 weak-resp 2)
    (enc (exp (gen) y-0) (exp (gen) x) (privk b-0)) (0 1))
  (label 117)
  (parent 108)
  (unrealized (2 0))
  (comment "empty cohort"))

Item 118, Parent: 108, Child: 126.

(cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) x) (privk b)) (exp (gen) (mul x y-0)))) (exp (gen) x) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x (rec y) y-0)) (cat (exp (gen) y) (mul x (rec y) y-0)) (exp (gen) (mul x y-0)) (exp (gen) (mul x y-0)) (enc (enc (exp (gen) x) (exp (gen) y-0) (privk a)) (exp (gen) (mul x y-0))) (cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) x) (privk b)) (exp (gen) (mul x y-0)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y-0)) weak-resp ((b b-0) (h h) (y y)) weak-resp ((a a) (b b) (h (exp (gen) y-0)) (x x)) weak-init station-weak 118
(defskeleton station-weak
  (vars (a b b-0 name) (h base) (x y y-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y-0)) (x x))
  (deflistener (exp (gen) (mul x y-0)))
  (deflistener (cat (exp (gen) y) (mul x (rec y) y-0)))
  (defstrand weak-resp 2 (b b-0) (h h) (y y))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y-0))
  (precedes ((0 0) (2 0)) ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 1) (0 1)))
  (absent (y-0 (exp (gen) x)) (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation encryption-test (added-strand weak-resp 2)
    (enc (exp (gen) y-0) (exp (gen) x) (privk b)) (0 1))
  (label 118)
  (parent 108)
  (unrealized (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 119, Parent: 109.

x x (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (gen) (mul x x-0)) (cat (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) weak-init ((a a) (b b) (h (exp (gen) x-0)) (x x)) weak-init station-weak 119
(defskeleton station-weak
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (gen) (mul x x-0)))
  (defstrand weak-init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (deflistener x)
  (precedes ((0 0) (3 1)) ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 2) (0 1)) ((4 1) (2 0)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (added-listener x) (mul x x-0) (2 0))
  (label 119)
  (parent 109)
  (unrealized (4 0))
  (comment "empty cohort"))

Item 120, Parent: 110.

x x (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (gen) (mul x y)) (cat (gen) (mul x y)) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) weak-resp ((a a) (b b) (h (exp (gen) y)) (x x)) weak-init station-weak 120
(defskeleton station-weak
  (vars (a b name) (x y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (gen) (mul x y)))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y))
  (deflistener x)
  (precedes ((0 0) (3 0)) ((0 0) (4 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (0 1)) ((4 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (added-listener x) (mul x y) (2 0))
  (label 120)
  (parent 110)
  (unrealized (4 0))
  (comment "empty cohort"))

Item 121, Parent: 111, Seen Child: 97.

(enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-0)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) x) x-0) (cat (exp (gen) x) x-0) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-0)) weak-init ((a a) (b b) (h (exp (gen) x-0)) (x x)) weak-init station-weak 121 (realized)
(defskeleton station-weak
  (vars (a b b-0 name) (x x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (cat (exp (gen) x) x-0))
  (defstrand weak-init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-0))
  (precedes ((0 0) (1 0)) ((0 0) (2 1)) ((1 1) (0 1)) ((2 2) (0 1)))
  (non-orig (privk a) (privk b))
  (precur (1 0))
  (uniq-gen x)
  (operation generalization deleted (1 0))
  (label 121)
  (parent 111)
  (seen 97)
  (unrealized)
  (comment "1 in cohort - 0 not yet seen"))

Item 122, Parent: 112, Seen Child: 98.

(cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (cat (exp (gen) x) y) (cat (exp (gen) x) y) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) weak-resp ((a a) (b b) (h (exp (gen) y)) (x x)) weak-init station-weak 122 (realized)
(defskeleton station-weak
  (vars (a b name) (x y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (cat (exp (gen) x) y))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y))
  (precedes ((0 0) (1 0)) ((0 0) (2 0)) ((1 1) (0 1)) ((2 1) (0 1)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (1 0))
  (uniq-gen x)
  (operation generalization deleted (1 0))
  (label 122)
  (parent 112)
  (seen 98)
  (unrealized)
  (comment "1 in cohort - 0 not yet seen"))

Item 123, Parent: 114.

x x (enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk b-0)) (exp (gen) (mul x x-1)))) (exp (gen) x-1) (exp (gen) x-0) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (cat (exp (gen) x-0) (mul x (rec x-0) x-1)) (exp (gen) (mul x x-1)) (exp (gen) (mul x x-1)) (enc (enc (exp (gen) x) (exp (gen) x-1) (privk a)) (exp (gen) (mul x x-1))) (cat (exp (gen) x-1) (enc (enc (exp (gen) x-1) (exp (gen) x) (privk b)) (exp (gen) (mul x x-1)))) (exp (gen) x) ((a b) (b b-0) (h (exp (gen) x)) (x x-1)) weak-init ((x x-0)) weak-init ((a a) (b b) (h (exp (gen) x-1)) (x x)) weak-init station-weak 123
(defskeleton station-weak
  (vars (a b b-0 name) (x x-0 x-1 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-1)) (x x))
  (deflistener (exp (gen) (mul x x-1)))
  (deflistener (cat (exp (gen) x-0) (mul x (rec x-0) x-1)))
  (defstrand weak-init 1 (x x-0))
  (defstrand weak-init 3 (a b) (b b-0) (h (exp (gen) x)) (x x-1))
  (deflistener x)
  (precedes ((0 0) (4 1)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 2) (0 1)) ((5 1) (2 0)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (added-listener x) (mul x (rec x-0) x-1) (2 0))
  (label 123)
  (parent 114)
  (unrealized (5 0))
  (comment "empty cohort"))

Item 124, Parent: 115.

x x (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) (exp (gen) x-0) (cat (exp (gen) x-0) (mul x (rec x-0) y)) (cat (exp (gen) x-0) (mul x (rec x-0) y)) (exp (gen) (mul x y)) (exp (gen) (mul x y)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul x y)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y)) weak-resp ((x x-0)) weak-init ((a a) (b b) (h (exp (gen) y)) (x x)) weak-init station-weak 124
(defskeleton station-weak
  (vars (a b name) (x x-0 y expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y)) (x x))
  (deflistener (exp (gen) (mul x y)))
  (deflistener (cat (exp (gen) x-0) (mul x (rec x-0) y)))
  (defstrand weak-init 1 (x x-0))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y))
  (deflistener x)
  (precedes ((0 0) (4 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 0) (2 0)) ((4 1) (0 1)) ((5 1) (2 0)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (added-listener x) (mul x (rec x-0) y) (2 0))
  (label 124)
  (parent 115)
  (unrealized (5 0))
  (comment "empty cohort"))

Item 125, Parent: 116.

x x (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0))) (cat (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk b-1)) (exp (gen) (mul x x-0)))) (exp (gen) x-0) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x (rec y) x-0)) (cat (exp (gen) y) (mul x (rec y) x-0)) (exp (gen) (mul x x-0)) (exp (gen) (mul x x-0)) (enc (enc (exp (gen) x) (exp (gen) x-0) (privk a)) (exp (gen) (mul x x-0))) (cat (exp (gen) x-0) (enc (enc (exp (gen) x-0) (exp (gen) x) (privk b)) (exp (gen) (mul x x-0)))) (exp (gen) x) ((a b) (b b-1) (h (exp (gen) x)) (x x-0)) weak-init ((b b-0) (h h) (y y)) weak-resp ((a a) (b b) (h (exp (gen) x-0)) (x x)) weak-init station-weak 125
(defskeleton station-weak
  (vars (a b b-0 b-1 name) (h base) (x y x-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) x-0)) (x x))
  (deflistener (exp (gen) (mul x x-0)))
  (deflistener (cat (exp (gen) y) (mul x (rec y) x-0)))
  (defstrand weak-resp 2 (b b-0) (h h) (y y))
  (defstrand weak-init 3 (a b) (b b-1) (h (exp (gen) x)) (x x-0))
  (deflistener x)
  (precedes ((0 0) (4 1)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 2) (0 1)) ((5 1) (2 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (added-listener x) (mul x (rec y) x-0) (2 0))
  (label 125)
  (parent 116)
  (unrealized (5 0))
  (comment "empty cohort"))

Item 126, Parent: 118.

x x (cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) x) (privk b)) (exp (gen) (mul x y-0)))) (exp (gen) x) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul x (rec y) y-0)) (cat (exp (gen) y) (mul x (rec y) y-0)) (exp (gen) (mul x y-0)) (exp (gen) (mul x y-0)) (enc (enc (exp (gen) x) (exp (gen) y-0) (privk a)) (exp (gen) (mul x y-0))) (cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) x) (privk b)) (exp (gen) (mul x y-0)))) (exp (gen) x) ((b b) (h (exp (gen) x)) (y y-0)) weak-resp ((b b-0) (h h) (y y)) weak-resp ((a a) (b b) (h (exp (gen) y-0)) (x x)) weak-init station-weak 126
(defskeleton station-weak
  (vars (a b b-0 name) (h base) (x y y-0 expn))
  (defstrand weak-init 3 (a a) (b b) (h (exp (gen) y-0)) (x x))
  (deflistener (exp (gen) (mul x y-0)))
  (deflistener (cat (exp (gen) y) (mul x (rec y) y-0)))
  (defstrand weak-resp 2 (b b-0) (h h) (y y))
  (defstrand weak-resp 2 (b b) (h (exp (gen) x)) (y y-0))
  (deflistener x)
  (precedes ((0 0) (4 0)) ((0 0) (5 0)) ((1 1) (0 1)) ((2 1) (1 0))
    ((3 1) (2 0)) ((4 1) (0 1)) ((5 1) (2 0)))
  (absent (y-0 (exp (gen) x)) (y h))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen x)
  (operation nonce-test (added-listener x) (mul x (rec y) y-0) (2 0))
  (label 126)
  (parent 118)
  (unrealized (5 0))
  (comment "empty cohort"))

Tree 127.

141 136 129 143 140 128 142 139 135 138 134 137 133 132 131 130 129 128 127
(defprotocol station-weak diffie-hellman
  (defrole weak-init
    (vars (x expn) (h base) (a b name))
    (trace (send (exp (gen) x))
      (recv (cat h (enc (enc h (exp (gen) x) (privk b)) (exp h x))))
      (send (enc (enc (exp (gen) x) h (privk a)) (exp h x)))))
  (defrole weak-resp
    (vars (y expn) (h base) (a b name))
    (trace (recv h)
      (send
        (cat (exp (gen) y)
          (enc (enc (exp (gen) y) h (privk b)) (exp h y))))
      (recv (enc (enc h (exp (gen) y) (privk a)) (exp h y))))
    (absent (y h))))

Item 127, Children: 128 129 130.

(enc (enc h (exp (gen) y) (privk a)) (exp h y)) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b)) (exp h y))) h ((a a) (b b) (h h) (y y)) weak-resp station-weak 127
(defskeleton station-weak
  (vars (a b name) (h base) (y expn))
  (defstrand weak-resp 3 (a a) (b b) (h h) (y y))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (label 127)
  (unrealized (0 2))
  (origs)
  (comment "3 in cohort - 3 not yet seen"))

Item 128, Parent: 127.

(enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) weak-init ((a a) (b b) (h (exp (gen) x)) (y y)) weak-resp station-weak 128 (realized)
(defskeleton station-weak
  (vars (a b b-0 name) (y x expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (defstrand weak-init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (precedes ((0 1) (1 1)) ((1 2) (0 2)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (operation encryption-test (added-strand weak-init 3)
    (enc (enc (exp (gen) x) (exp (gen) y) (privk a))
      (exp (gen) (mul y x))) (0 2))
  (label 128)
  (parent 127)
  (unrealized)
  (shape)
  (maps ((0) ((a a) (b b) (y y) (h (exp (gen) x)))))
  (origs))

Item 129, Parent: 127.

(cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) y) (privk a)) (exp (gen) (mul y y-0)))) (exp (gen) y) (enc (enc (exp (gen) y-0) (exp (gen) y) (privk a)) (exp (gen) (mul y y-0))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) y-0) (privk b)) (exp (gen) (mul y y-0)))) (exp (gen) y-0) ((b a) (h (exp (gen) y)) (y y-0)) weak-resp ((a a) (b b) (h (exp (gen) y-0)) (y y)) weak-resp station-weak 129 (realized)
(defskeleton station-weak
  (vars (a b name) (y y-0 expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) y-0)) (y y))
  (defstrand weak-resp 2 (b a) (h (exp (gen) y)) (y y-0))
  (precedes ((0 1) (1 0)) ((1 1) (0 2)))
  (absent (y-0 (exp (gen) y)) (y (exp (gen) y-0)))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (operation encryption-test (added-strand weak-resp 2)
    (enc (enc (exp (gen) y-0) (exp (gen) y) (privk a))
      (exp (gen) (mul y y-0))) (0 2))
  (label 129)
  (parent 127)
  (unrealized)
  (shape)
  (maps ((0) ((a a) (b b) (y y) (h (exp (gen) y-0)))))
  (origs))

Item 130, Parent: 127, Children: 131 132.

(exp h y) (exp h y) (enc (enc h (exp (gen) y) (privk a)) (exp h y)) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b)) (exp h y))) h ((a a) (b b) (h h) (y y)) weak-resp station-weak 130
(defskeleton station-weak
  (vars (a b name) (h base) (y expn))
  (defstrand weak-resp 3 (a a) (b b) (h h) (y y))
  (deflistener (exp h y))
  (precedes ((0 1) (1 0)) ((1 1) (0 2)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (operation encryption-test (added-listener (exp h y))
    (enc (enc h (exp (gen) y) (privk a)) (exp h y)) (0 2))
  (label 130)
  (parent 127)
  (unrealized (0 2) (1 0))
  (comment "2 in cohort - 2 not yet seen"))

Item 131, Parent: 130.

(exp (gen) y) (exp (gen) y) (enc (enc (gen) (exp (gen) y) (privk a)) (exp (gen) y)) (cat (exp (gen) y) (enc (enc (exp (gen) y) (gen) (privk b)) (exp (gen) y))) (gen) ((a a) (b b) (h (gen)) (y y)) weak-resp station-weak 131
(defskeleton station-weak
  (vars (a b name) (y expn))
  (defstrand weak-resp 3 (a a) (b b) (h (gen)) (y y))
  (deflistener (exp (gen) y))
  (precedes ((0 1) (1 0)) ((1 1) (0 2)))
  (absent (y (gen)))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (operation nonce-test (displaced 2 0 weak-resp 2) (exp (gen) y-0)
    (1 0))
  (label 131)
  (parent 130)
  (unrealized (0 2))
  (comment "empty cohort"))

Item 132, Parent: 130, Children: 133 134 135 136.

(cat (exp h (mul y (rec w))) w) (cat (exp h (mul y (rec w))) w) (exp h y) (exp h y) (enc (enc h (exp (gen) y) (privk a)) (exp h y)) (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b)) (exp h y))) h ((a a) (b b) (h h) (y y)) weak-resp station-weak 132
(defskeleton station-weak
  (vars (a b name) (h base) (y expn) (w expr))
  (defstrand weak-resp 3 (a a) (b b) (h h) (y y))
  (deflistener (exp h y))
  (deflistener (cat (exp h (mul y (rec w))) w))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)))
  (absent (y h))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (precur (2 0))
  (operation nonce-test (added-listener (cat (exp h (mul y (rec w))) w))
    (exp h y) (1 0))
  (label 132)
  (parent 130)
  (unrealized (0 2) (2 0))
  (comment "4 in cohort - 4 not yet seen"))

Item 133, Parent: 132, Child: 137.

(cat (gen) (mul w y)) (cat (gen) (mul w y)) (exp (gen) (mul w y)) (exp (gen) (mul w y)) (enc (enc (exp (gen) w) (exp (gen) y) (privk a)) (exp (gen) (mul w y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) w) (privk b)) (exp (gen) (mul w y)))) (exp (gen) w) ((a a) (b b) (h (exp (gen) w)) (y y)) weak-resp station-weak 133
(defskeleton station-weak
  (vars (a b name) (w expr) (y expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) w)) (y y))
  (deflistener (exp (gen) (mul w y)))
  (deflistener (cat (gen) (mul w y)))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)))
  (absent (y (exp (gen) w)))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (precur (2 0))
  (operation nonce-test
    (contracted (y-0 y) (h (exp (gen) w)) (w (mul w y))) (gen) (2 0))
  (label 133)
  (parent 132)
  (unrealized (0 2) (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 134, Parent: 132, Child: 138.

(exp (gen) x) (cat (exp (gen) x) (mul w y)) (cat (exp (gen) x) (mul w y)) (exp (gen) (mul w x y)) (exp (gen) (mul w x y)) (enc (enc (exp (gen) (mul w x)) (exp (gen) y) (privk a)) (exp (gen) (mul w x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) (mul w x)) (privk b)) (exp (gen) (mul w x y)))) (exp (gen) (mul w x)) ((x x)) weak-init ((a a) (b b) (h (exp (gen) (mul w x))) (y y)) weak-resp station-weak 134
(defskeleton station-weak
  (vars (a b name) (w expr) (x y expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) (mul w x))) (y y))
  (deflistener (exp (gen) (mul w x y)))
  (deflistener (cat (exp (gen) x) (mul w y)))
  (defstrand weak-init 1 (x x))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 0) (2 0)))
  (absent (y (exp (gen) (mul w x))))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y)
  (operation nonce-test (added-strand weak-init 1) (exp (gen) x) (2 0))
  (label 134)
  (parent 132)
  (unrealized (0 2) (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 135, Parent: 132, Children: 139 140.

(cat (exp (gen) y) w) (cat (exp (gen) y) w) (exp (gen) (mul w y)) (exp (gen) (mul w y)) (enc (enc (exp (gen) w) (exp (gen) y) (privk a)) (exp (gen) (mul w y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) w) (privk b)) (exp (gen) (mul w y)))) (exp (gen) w) ((a a) (b b) (h (exp (gen) w)) (y y)) weak-resp station-weak 135
(defskeleton station-weak
  (vars (a b name) (w expr) (y expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) w)) (y y))
  (deflistener (exp (gen) (mul w y)))
  (deflistener (cat (exp (gen) y) w))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)))
  (absent (y (exp (gen) w)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y)
  (operation nonce-test (displaced 3 0 weak-resp 2) (exp (gen) y-0)
    (2 0))
  (label 135)
  (parent 132)
  (unrealized (0 2))
  (comment "2 in cohort - 2 not yet seen"))

Item 136, Parent: 132, Child: 141.

(cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul w y-0)) (cat (exp (gen) y) (mul w y-0)) (exp (gen) (mul w y y-0)) (exp (gen) (mul w y y-0)) (enc (enc (exp (gen) (mul w y)) (exp (gen) y-0) (privk a)) (exp (gen) (mul w y y-0))) (cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) (mul w y)) (privk b)) (exp (gen) (mul w y y-0)))) (exp (gen) (mul w y)) ((b b-0) (h h) (y y)) weak-resp ((a a) (b b) (h (exp (gen) (mul w y))) (y y-0)) weak-resp station-weak 136
(defskeleton station-weak
  (vars (a b b-0 name) (h base) (w expr) (y y-0 expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) (mul w y))) (y y-0))
  (deflistener (exp (gen) (mul w y y-0)))
  (deflistener (cat (exp (gen) y) (mul w y-0)))
  (defstrand weak-resp 2 (b b-0) (h h) (y y))
  (precedes ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y h) (y-0 (exp (gen) (mul w y))))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y-0)
  (operation nonce-test (added-strand weak-resp 2) (exp (gen) y) (2 0))
  (label 136)
  (parent 132)
  (unrealized (0 2) (2 0))
  (comment "1 in cohort - 1 not yet seen"))

Item 137, Parent: 133.

y y (cat (gen) (mul w y)) (cat (gen) (mul w y)) (exp (gen) (mul w y)) (exp (gen) (mul w y)) (enc (enc (exp (gen) w) (exp (gen) y) (privk a)) (exp (gen) (mul w y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) w) (privk b)) (exp (gen) (mul w y)))) (exp (gen) w) ((a a) (b b) (h (exp (gen) w)) (y y)) weak-resp station-weak 137
(defskeleton station-weak
  (vars (a b name) (w expr) (y expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) w)) (y y))
  (deflistener (exp (gen) (mul w y)))
  (deflistener (cat (gen) (mul w y)))
  (deflistener y)
  (precedes ((0 1) (3 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 1) (2 0)))
  (absent (y (exp (gen) w)))
  (non-orig (privk a) (privk b))
  (uniq-gen y)
  (precur (2 0))
  (operation nonce-test (added-listener y) (mul w y) (2 0))
  (label 137)
  (parent 133)
  (unrealized (0 2) (3 0))
  (comment "empty cohort"))

Item 138, Parent: 134.

y y (exp (gen) x) (cat (exp (gen) x) (mul w y)) (cat (exp (gen) x) (mul w y)) (exp (gen) (mul w x y)) (exp (gen) (mul w x y)) (enc (enc (exp (gen) (mul w x)) (exp (gen) y) (privk a)) (exp (gen) (mul w x y))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) (mul w x)) (privk b)) (exp (gen) (mul w x y)))) (exp (gen) (mul w x)) ((x x)) weak-init ((a a) (b b) (h (exp (gen) (mul w x))) (y y)) weak-resp station-weak 138
(defskeleton station-weak
  (vars (a b name) (w expr) (x y expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) (mul w x))) (y y))
  (deflistener (exp (gen) (mul w x y)))
  (deflistener (cat (exp (gen) x) (mul w y)))
  (defstrand weak-init 1 (x x))
  (deflistener y)
  (precedes ((0 1) (4 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 0) (2 0))
    ((4 1) (2 0)))
  (absent (y (exp (gen) (mul w x))))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y)
  (operation nonce-test (added-listener y) (mul w y) (2 0))
  (label 138)
  (parent 134)
  (unrealized (0 2) (4 0))
  (comment "empty cohort"))

Item 139, Parent: 135, Child: 142.

(enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (exp (gen) (mul y x)) (exp (gen) (mul y x)) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) weak-init ((a a) (b b) (h (exp (gen) x)) (y y)) weak-resp station-weak 139 (realized)
(defskeleton station-weak
  (vars (a b b-0 name) (y x expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (exp (gen) (mul y x)))
  (deflistener (cat (exp (gen) y) x))
  (defstrand weak-init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (precedes ((0 1) (2 0)) ((0 1) (3 1)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 2) (0 2)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y)
  (operation encryption-test (added-strand weak-init 3)
    (enc (exp (gen) x) (exp (gen) y) (privk a)) (0 2))
  (label 139)
  (parent 135)
  (unrealized)
  (comment "1 in cohort - 1 not yet seen"))

Item 140, Parent: 135, Child: 143.

(cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) y) (privk a)) (exp (gen) (mul y y-0)))) (exp (gen) y) (cat (exp (gen) y) y-0) (cat (exp (gen) y) y-0) (exp (gen) (mul y y-0)) (exp (gen) (mul y y-0)) (enc (enc (exp (gen) y-0) (exp (gen) y) (privk a)) (exp (gen) (mul y y-0))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) y-0) (privk b)) (exp (gen) (mul y y-0)))) (exp (gen) y-0) ((b a) (h (exp (gen) y)) (y y-0)) weak-resp ((a a) (b b) (h (exp (gen) y-0)) (y y)) weak-resp station-weak 140 (realized)
(defskeleton station-weak
  (vars (a b name) (y y-0 expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) y-0)) (y y))
  (deflistener (exp (gen) (mul y y-0)))
  (deflistener (cat (exp (gen) y) y-0))
  (defstrand weak-resp 2 (b a) (h (exp (gen) y)) (y y-0))
  (precedes ((0 1) (2 0)) ((0 1) (3 0)) ((1 1) (0 2)) ((2 1) (1 0))
    ((3 1) (0 2)))
  (absent (y-0 (exp (gen) y)) (y (exp (gen) y-0)))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y)
  (operation encryption-test (added-strand weak-resp 2)
    (enc (exp (gen) y-0) (exp (gen) y) (privk a)) (0 2))
  (label 140)
  (parent 135)
  (unrealized)
  (comment "1 in cohort - 1 not yet seen"))

Item 141, Parent: 136.

y-0 y-0 (cat (exp (gen) y) (enc (enc (exp (gen) y) h (privk b-0)) (exp h y))) h (cat (exp (gen) y) (mul w y-0)) (cat (exp (gen) y) (mul w y-0)) (exp (gen) (mul w y y-0)) (exp (gen) (mul w y y-0)) (enc (enc (exp (gen) (mul w y)) (exp (gen) y-0) (privk a)) (exp (gen) (mul w y y-0))) (cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) (mul w y)) (privk b)) (exp (gen) (mul w y y-0)))) (exp (gen) (mul w y)) ((b b-0) (h h) (y y)) weak-resp ((a a) (b b) (h (exp (gen) (mul w y))) (y y-0)) weak-resp station-weak 141
(defskeleton station-weak
  (vars (a b b-0 name) (h base) (w expr) (y y-0 expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) (mul w y))) (y y-0))
  (deflistener (exp (gen) (mul w y y-0)))
  (deflistener (cat (exp (gen) y) (mul w y-0)))
  (defstrand weak-resp 2 (b b-0) (h h) (y y))
  (deflistener y-0)
  (precedes ((0 1) (4 0)) ((1 1) (0 2)) ((2 1) (1 0)) ((3 1) (2 0))
    ((4 1) (2 0)))
  (absent (y h) (y-0 (exp (gen) (mul w y))))
  (non-orig (privk a) (privk b))
  (precur (2 0))
  (uniq-gen y-0)
  (operation nonce-test (added-listener y-0) (mul w y-0) (2 0))
  (label 141)
  (parent 136)
  (unrealized (0 2) (4 0))
  (comment "empty cohort"))

Item 142, Parent: 139, Seen Child: 128.

(enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b-0)) (exp (gen) (mul y x)))) (exp (gen) x) (cat (exp (gen) y) x) (cat (exp (gen) y) x) (enc (enc (exp (gen) x) (exp (gen) y) (privk a)) (exp (gen) (mul y x))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) x) (privk b)) (exp (gen) (mul y x)))) (exp (gen) x) ((a a) (b b-0) (h (exp (gen) y)) (x x)) weak-init ((a a) (b b) (h (exp (gen) x)) (y y)) weak-resp station-weak 142 (realized)
(defskeleton station-weak
  (vars (a b b-0 name) (y x expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) x)) (y y))
  (deflistener (cat (exp (gen) y) x))
  (defstrand weak-init 3 (a a) (b b-0) (h (exp (gen) y)) (x x))
  (precedes ((0 1) (1 0)) ((0 1) (2 1)) ((1 1) (0 2)) ((2 2) (0 2)))
  (absent (y (exp (gen) x)))
  (non-orig (privk a) (privk b))
  (precur (1 0))
  (uniq-gen y)
  (operation generalization deleted (1 0))
  (label 142)
  (parent 139)
  (seen 128)
  (unrealized)
  (comment "1 in cohort - 0 not yet seen"))

Item 143, Parent: 140, Seen Child: 129.

(cat (exp (gen) y-0) (enc (enc (exp (gen) y-0) (exp (gen) y) (privk a)) (exp (gen) (mul y y-0)))) (exp (gen) y) (cat (exp (gen) y) y-0) (cat (exp (gen) y) y-0) (enc (enc (exp (gen) y-0) (exp (gen) y) (privk a)) (exp (gen) (mul y y-0))) (cat (exp (gen) y) (enc (enc (exp (gen) y) (exp (gen) y-0) (privk b)) (exp (gen) (mul y y-0)))) (exp (gen) y-0) ((b a) (h (exp (gen) y)) (y y-0)) weak-resp ((a a) (b b) (h (exp (gen) y-0)) (y y)) weak-resp station-weak 143 (realized)
(defskeleton station-weak
  (vars (a b name) (y y-0 expn))
  (defstrand weak-resp 3 (a a) (b b) (h (exp (gen) y-0)) (y y))
  (deflistener (cat (exp (gen) y) y-0))
  (defstrand weak-resp 2 (b a) (h (exp (gen) y)) (y y-0))
  (precedes ((0 1) (1 0)) ((0 1) (2 0)) ((1 1) (0 2)) ((2 1) (0 2)))
  (absent (y-0 (exp (gen) y)) (y (exp (gen) y-0)))
  (non-orig (privk a) (privk b))
  (precur (1 0))
  (uniq-gen y)
  (operation generalization deleted (1 0))
  (label 143)
  (parent 140)
  (seen 129)
  (unrealized)
  (comment "1 in cohort - 0 not yet seen"))