actors :: FannkuchRedux :: async
actors :: FannkuchRedux :: count_flips
actors :: FannkuchRedux :: defaultinit
actors :: FannkuchRedux :: print_p
actors :: FannkuchRedux :: run
actors :: FannkuchRedux :: run_task
actors $ FannkuchRedux :: SELF
Type of this instance, automatically specialized in every classactors :: FannkuchRedux :: async
core :: Object :: class_factory
Implementation used byget_class to create the specific class.
			actors :: FannkuchRedux :: count_flips
core :: Object :: defaultinit
actors :: FannkuchRedux :: defaultinit
core :: Object :: is_same_instance
Return true ifself and other are the same instance (i.e. same identity).
			core :: Object :: is_same_serialized
Isself the same as other in a serialization context?
			core :: Object :: is_same_type
Return true ifself and other have the same dynamic type.
			core :: Object :: output_class_name
Display class name on stdout (debug only).actors :: FannkuchRedux :: print_p
actors :: FannkuchRedux :: run
actors :: FannkuchRedux :: run_task
class FannkuchRedux
	actor
	var p: Array[Int] is noautoinit
	var pp: Array[Int] is noautoinit
	var count: Array[Int] is noautoinit
	fun print_p do
		for i in [0..p.length[ do printn p[i] + 1
		print ""
	end
	fun first_permutation(idx: Int) do
		for i in [0..p.length[ do p[i] = i
		for i in [0..count.length[.reverse_iterator do
			var d = idx / fact[i]
			count[i] = d
			idx = idx % fact[i]
			p.copy_to(0, i+1, pp, 0)
			for j in [0..i] do p[j] = if j + d <= i then pp[j+d] else pp[j+d-i-1]
		end
	end
	fun next_permutation do
		var first = p[1]
		p[1] = p[0]
		p[0] = first
		var i = 1
		count[i] += 1
		while count[i] > i do
			count[i] = 0
			i += 1
			p[0] = p[1]
			var next = p[0]
			for j in [1..i[ do p[j] = p[j+1]
			p[i] = first
			first = next
			count[i] += 1
		end
	end
	fun count_flips: Int do
		var flips = 1
		var first = p[0]
		if p[first] != 0 then
			p.copy_to(0, pp.length, pp, 0)
			while pp[first] != 0 do
				flips += 1
				var lo = 1
				var hi = first - 1
				while lo < hi do
					var t = pp[lo]
					pp[lo] = pp[hi]
					pp[hi] = t
					lo += 1
					hi -= 1
				end
				var t = pp[first]
				pp[first] = first
				first = t
			end
		end
		return flips
	end
	fun run_task(task: Int) do
		var idx_min = task * chunk_sz
		var idx_max = fact[n].min(idx_min + chunk_sz)
		first_permutation(idx_min)
		var maxflips = 1
		var chk_sum = 0
		for i in [idx_min..idx_max[ do
			if p[0] != 0 then
				var flips = count_flips
				maxflips = maxflips.max(flips)
				chk_sum += if i % 2 == 0 then flips else -flips
			end
			if i + 1 != idx_max then next_permutation
		end
		max_flips[task] = maxflips
		chk_sums[task] = chk_sum
	end
	fun run do
		p = new Array[Int].with_capacity(n)
		for i in [0..n[ do p.add(0)
		pp = new Array[Int].with_capacity(n)
		for i in [0..n[ do pp.add(0)
		count = new Array[Int].with_capacity(n)
		for i in [0..n[ do count.add(0)
		var task = 0
		loop
			task = task_id.get_and_increment
			if task < n_tasks then run_task(task) else break
		end
	end
end
					lib/actors/examples/fannkuchredux/fannkuchredux.nit:24,1--132,3