4 let (|-) g f x = f (g x)
13 val string_with_color : string -> color -> string
15 val clear : unit -> unit
17 val reset : unit -> unit
24 let ansi_code_clear = "\027[2J" (* Clear screen *)
25 let ansi_code_reset = "\027[1;1H" (* Reset cursor position *)
27 let string_of_color = function
28 | `green -> "\027[0;32m"
29 | `red -> "\027[1;31m"
30 | `white -> "\027[1;37m"
32 let string_with_color s c =
33 sprintf "%s%s\027[0m" (string_of_color c) s
36 print_string ansi_code_clear
39 print_string ansi_code_reset
43 module type MATRIX = sig
45 type t = {r : int; k : int}
50 val create : rs:int -> ks:int -> 'a -> 'a t
52 val get_neighbors : 'a t -> Point.t -> 'a list
54 val map : 'a t -> f:('a -> 'b) -> 'b t
56 val mapi : 'a t -> f:(Point.t -> 'a -> 'b) -> 'b t
58 val iter : 'a t -> f:(Point.t -> 'a -> unit) -> unit
60 val print : 'a t -> to_string:('a -> string) -> unit
63 module Matrix : MATRIX = struct
65 type t = {r : int; k : int}
73 module Direction = struct
78 let all = [ NW ; N ; NE
86 | NW -> {r = -1; k = -1}
87 | N -> {r = -1; k = 0}
88 | NE -> {r = -1; k = 1}
89 | W -> {r = 0; k = -1}
91 | SW -> {r = 1; k = -1}
93 | SE -> {r = 1; k = 1}
96 type 'a t = 'a array array
98 let create ~rs ~ks x =
99 Array.make_matrix ~dimx:rs ~dimy:ks x
106 f {Point.r; Point.k} x
110 let print t ~to_string =
113 Array.iter r ~f:(fun x -> printf "%s" (to_string x));
118 Array.map t ~f:(Array.map ~f:(fun x -> f x))
125 f {Point.r; Point.k} x
129 let get t {Point.r; Point.k} =
132 let is_within_bounds t {Point.r; Point.k} =
134 | [||] -> assert false
136 r >= 0 && r < Array.length t &&
137 k >= 0 && k < Array.length t.(0)
139 let neighborhood t point =
140 List.map Direction.all ~f:Direction.to_offset
141 |> List.map ~f:(fun offset_point -> Point.(point + offset_point))
142 |> List.filter ~f:(is_within_bounds t)
144 let get_neighbors t point =
145 List.map (neighborhood t point) ~f:(get t)
149 module PhenoType : sig
152 val create : char -> Terminal.color option -> t
154 val to_string : t -> string
156 type t = { color : Terminal.color option
160 let create character color =
163 let to_string = function
164 | {color=None; character} ->
165 String.of_char character
166 | {color=Some c; character} ->
167 Terminal.string_with_color (String.of_char character) c
172 module State = struct
173 type t = Alive of char
177 type t = { state : State.t
178 ; pheno : PhenoType.t
183 module type RULE = sig
184 val create : unit -> Cell.t
186 val transition : self:Cell.State.t
187 -> neighbors:Cell.State.t list
192 module Life : RULE = struct
196 val of_int : int -> t
198 val to_int : t -> int
200 val to_cell : t -> Cell.t
202 val of_cell_state : Cell.State.t -> t
206 let of_int = function
211 let to_int = function
215 let to_pheno = function
216 | D -> PhenoType.create ' ' None
217 | A -> PhenoType.create 'o' (Some `white)
219 let of_cell_state = function
220 | Cell.State.Dead -> D
221 | Cell.State.Alive 'A' -> A
222 | Cell.State.Alive _ -> D (* Foreign cell *)
224 let to_cell_state = function
225 | D -> Cell.State.Dead
226 | A -> Cell.State.Alive 'A'
229 { Cell.state = t |> to_cell_state
230 ; Cell.pheno = t |> to_pheno
234 let next state ~live_neighbors =
236 | State.A when live_neighbors < 2 -> State.D
237 | State.A when live_neighbors < 4 -> State.A
238 | State.A when live_neighbors > 3 -> State.D
239 | State.D when live_neighbors = 3 -> State.A
244 Random.int 2 |> State.of_int |> State.to_cell
246 let live_neighbors neighbors =
247 neighbors |> List.map ~f:(State.of_cell_state |- State.to_int)
248 |> List.fold_left ~init:0 ~f:(+)
250 let transition ~self ~neighbors =
251 self |> State.of_cell_state
252 |> next ~live_neighbors:(live_neighbors neighbors)
257 module ForestFire : RULE = struct
261 val is_burning : t -> bool
263 val of_int : int -> t
265 val to_int : t -> int
267 val to_cell : t -> Cell.t
269 val of_cell_state : Cell.State.t -> t
273 let is_burning = function
278 let of_int = function
284 let to_int = function
289 let to_pheno = function
290 | E -> PhenoType.create ' ' None
291 | T -> PhenoType.create 'T' (Some `green)
292 | B -> PhenoType.create '#' (Some `red)
294 let of_cell_state = function
295 | Cell.State.Dead -> E
296 | Cell.State.Alive 'T' -> T
297 | Cell.State.Alive 'B' -> B
298 | Cell.State.Alive _ -> E (* Foreign cell *)
300 let to_cell_state = function
301 | E -> Cell.State.Dead
302 | T -> Cell.State.Alive 'T'
303 | B -> Cell.State.Alive 'B'
306 { Cell.state = t |> to_cell_state
307 ; Cell.pheno = t |> to_pheno
312 Random.int 3 |> State.of_int |> State.to_cell
314 let f = 0.000001 (* Probability of spontaneous ignition *)
315 let p = 0.1 (* Probability of spontaneous growth *)
318 (Random.float 1.0) <= p
320 let next state ~burning_neighbors =
321 match state, burning_neighbors with
322 | State.E, _ when is_probable p -> State.T
323 | State.E, _ -> State.E
324 | State.T, 0 when is_probable f -> State.B
325 | State.T, _ when burning_neighbors > 0 -> State.B
326 | State.T, _ -> State.T
327 | State.B, _ -> State.E
329 let burning_neighbors neighbors =
330 neighbors |> List.map ~f:State.of_cell_state
331 |> List.filter ~f:State.is_burning
332 |> List.map ~f:State.to_int
333 |> List.fold_left ~init:0 ~f:(+)
335 let transition ~self ~neighbors =
336 self |> State.of_cell_state
337 |> next ~burning_neighbors:(burning_neighbors neighbors)
342 module Automaton : sig
345 val create : rows:int
348 -> rules: (module RULE) list
353 type cell = { data : Cell.t
354 ; rule : (module RULE)
357 type t = { grid : cell Matrix.t
358 ; interval : Time.Span.t
362 let create ~rows:rs ~columns:ks ~interval ~rules =
363 let n = List.length rules in
365 let rule = List.nth_exn rules (Random.int n) in
366 let module Rule = (val rule : RULE) in
368 ; data = Rule.create ()
372 { grid = Matrix.map ~f:init (Matrix.create ~rs ~ks ())
373 ; interval = Time.Span.of_float interval
374 ; bar = String.make ks '-'
377 let cell_to_string cell =
378 PhenoType.to_string cell.data.Cell.pheno
383 Matrix.print t.grid ~to_string:cell_to_string;
388 Matrix.mapi t.grid ~f:(
389 fun point {rule; data} ->
390 let module Rule = (val rule : RULE) in
391 let neighbors = Matrix.get_neighbors t.grid point in
394 ~self:data.Cell.state
395 ~neighbors:(List.map neighbors ~f:(fun c -> c.data.Cell.state))
404 Time.pause t.interval;
409 let main interval () =
411 let rows, columns = Or_error.ok_exn Linux_ext.get_terminal_size () in
413 [ (module Life : RULE)
414 ; (module ForestFire : RULE)
417 Automaton.loop (Automaton.create ~rows:(rows - 3) ~columns ~interval ~rules)
421 let summary = "Polymorphic Cellular Automata" in
422 let spec = Command.Spec.(empty
423 +> flag "-i" (optional_with_default 0.1 float)
424 ~doc:" Induced interval between generations."
427 Command.basic ~summary spec main
430 let () = Command.run spec