Difference between revisions of "Chaitin's construction"

From HaskellWiki
Jump to navigation Jump to search
(Also other details go to the separate Chaitin's construction/Parser page)
(Defining concept which do not use the notion of ``code'')
Line 25: Line 25:
   
 
Having seen this, decoding is rather straightforward.
 
Having seen this, decoding is rather straightforward.
[[/Parser|Here is a parser]] for illustration, but it serves only didactical purposes: it will not be used in the final implementation, because a good term geerator makes parsing superfluous at this task.
+
[[/Parser|Here is a parser]] for illustration, but it serves only didactical purposes: it will not be used in the final implementation, because a good term generator makes parsing superfluous at this task.
   
 
=== Chaitin's construction ===
 
=== Chaitin's construction ===
Line 42: Line 42:
 
;“Absolute value”
 
;“Absolute value”
 
:should mean the length of a bit sequence (not [[combinatory logic]] term evaluation!)
 
:should mean the length of a bit sequence (not [[combinatory logic]] term evaluation!)
  +
  +
== Handling [[combinatory logic]] terms directly ==
  +
  +
We can avoid referring to any code notion, if we transfer (lift) the noton of “length” from bit sequences to [[combinatory logic]] terms in an appropriate way. Let us call it the “norm” of the term.
  +
  +
:<math>\sum_{p\in\mathrm{CL},\;\mathrm{hnf}\;p} 2^{-\left\Vert p\right\Vert}</math>
  +
where
  +
:<math>\left\Vert\cdot\right\Vert : \mathrm{CL}\to\mathbb N</math>
  +
:<math>\left\Vert\mathbf K\right\Vert \equiv 2</math>
  +
:<math>\left\Vert\mathbf S\right\Vert \equiv 2</math>
  +
:<math>\left\Vert\left(x\;y\right)\right\Vert \equiv 1 + \left\Vert x\right\Vert + \left\Vert y\right\Vert</math>
  +
  +
Question:
  +
If we move away from the approaches referring to any code concept, then
  +
could we define norm in other ways? E.g.
  +
:<math>\left\Vert\cdot\right\Vert : \mathrm{CL}\to\mathbb N</math>
  +
:<math>\left\Vert\mathbf K\right\Vert \equiv 1</math>
  +
:<math>\left\Vert\mathbf S\right\Vert \equiv 1</math>
  +
:<math>\left\Vert\left(x\;y\right)\right\Vert \equiv 1 + \left\Vert x\right\Vert + \left\Vert y\right\Vert</math>
  +
And is it worth doing it at all? The former one, at leat, had a good theoretical foundation (analysis or arithmetic). This latter one is not so cleaner, that we should prefer it, so, lacking theoretical grounds.
  +
  +
What I really want is to exclude the underestimation of this “probability of termination” number -- an underestimation coming from syntactically non-correct codes. Thus taking only termination vs nontermination into account, when calculating this number (which can be interpreted as a probability).
  +
  +
  +
  +
=== Term generator ===
  +
  +
<haskell>
  +
module CLGen where
  +
  +
import Generator (gen0)
  +
import CL (k, s, apply)
  +
  +
direct :: [CL]
  +
direct = gen0 apply [s, k]
  +
</haskell>
  +
  +
<haskell>
  +
module Generator (gen0) where
  +
  +
import PreludeExt (cross)
  +
  +
gen0 :: (a -> a -> a) -> [a] -> [a]
  +
gen0 f c = gen f c 0
  +
  +
gen :: (a -> a -> a) -> [a] -> Integer -> [a]
  +
gen f c n = sizedGen f c n ++ gen f c (succ n)
  +
  +
sizedGen :: (a -> a -> a) -> [a] -> Integer -> [a]
  +
sizedGen f c 0 = c
  +
sizedGen f c (n + 1) = map (uncurry f) $ concat [sizedGen f c i `cross` sizedGen f c (n - i) | i <- [0..n]]
  +
</haskell>
   
 
== Related concepts ==
 
== Related concepts ==

Revision as of 14:00, 4 August 2006

Introduction

Are there any real numbers which are defined exactly, but cannot be computed? This question leads us to exact real arithmetic, foundations of mathematics and computer science.

See Wikipedia article on Chaitin's construction, referring to e.g.

Basing it on combinatory logic

Some more direct relatedness to functional programming: we can base on combinatory logic (instead of a Turing machine).

Coding

See the prefix coding system described in Binary Lambda Calculus and Combinatory Logic (page 20) written by John Tromp:

of course, , are meta-variables, and also some other notations are changed slightly.

Decoding

Having seen this, decoding is rather straightforward. Here is a parser for illustration, but it serves only didactical purposes: it will not be used in the final implementation, because a good term generator makes parsing superfluous at this task.

Chaitin's construction

Now, Chaitin's construction will be here

where

should denote an unary predicate “has normal form” (“terminates”)
should mean an operator “decode” (a function from finite bit sequences to combinatory logic terms)
should denote the set of all finite bit sequences
should denote the set of syntactically correct bit sequences (semantically, they may either terminate or diverge), i.e. the domain of the decoding function, i.e. the range of the coding function. Thus,
“Absolute value”
should mean the length of a bit sequence (not combinatory logic term evaluation!)

Handling combinatory logic terms directly

We can avoid referring to any code notion, if we transfer (lift) the noton of “length” from bit sequences to combinatory logic terms in an appropriate way. Let us call it the “norm” of the term.

where

Question: If we move away from the approaches referring to any code concept, then could we define norm in other ways? E.g.

And is it worth doing it at all? The former one, at leat, had a good theoretical foundation (analysis or arithmetic). This latter one is not so cleaner, that we should prefer it, so, lacking theoretical grounds.

What I really want is to exclude the underestimation of this “probability of termination” number -- an underestimation coming from syntactically non-correct codes. Thus taking only termination vs nontermination into account, when calculating this number (which can be interpreted as a probability).


Term generator

 module CLGen where

 import Generator (gen0)
 import CL (k, s, apply)

 direct :: [CL]
 direct = gen0 apply [s, k]
 module Generator (gen0) where

 import PreludeExt (cross)

 gen0 :: (a -> a -> a) -> [a] -> [a]
 gen0 f c = gen f c 0

 gen :: (a -> a -> a) -> [a] -> Integer -> [a]
 gen f c n = sizedGen f c n ++ gen f c (succ n)

 sizedGen :: (a -> a -> a) -> [a] -> Integer -> [a]
 sizedGen f c 0 = c
 sizedGen f c (n + 1) = map (uncurry f) $ concat [sizedGen f c i `cross` sizedGen f c (n - i) | i <- [0..n]]

Related concepts

To do

Writing a program in Haskell -- or in combinatory logic:-) -- which could help in making conjectures on combinatory logic-based Chaitin's constructions. It would make only approximations, in a similar way that most Mandelbrot plotting softwares work: it would ask for a maximum limit of iterations.

chaitin --computation=cl --coding=tromp --limit-of-iterations=5000 --digits=10 --decimal