src/Tools/isac/Interpret/solve.sml
author Walther Neuper <wneuper@ist.tugraz.at>
Tue, 27 Dec 2016 13:20:33 +0100
changeset 59283 96c2da5217f8
parent 59279 255c853ea2f0
child 59286 d08c6c4248b2
permissions -rw-r--r--
clean structure Ctree continued

Note: divide Ctree into several parts postponed
until other structs have signature (in particular, smltools.sml)
     1 (* Title:  solve an example by interpreting a method's script
     2    Author: Walther Neuper 1999
     3    (c) copyright due to lincense terms.
     4 1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890
     5         10        20        30        40        50        60        70        80         90      100
     6 *)
     7 
     8 structure Solve =
     9 struct
    10 open Ctree;
    11 
    12 fun safe (ScrState (_,_,_,_,s,_)) = s
    13   | safe (RrlsState _) = Safe;
    14 
    15 type mstID = string;
    16 type tac'_ = mstID * tac; (*DG <-> ME*)
    17 val e_tac'_ = ("Empty_Tac", Empty_Tac):tac'_;
    18 
    19 fun mk_tac'_   m = case m of
    20   Init_Proof (ppc, spec)    => ("Init_Proof", Init_Proof (ppc, spec )) 
    21 | Model_Problem             => ("Model_Problem", Model_Problem)
    22 | Refine_Tacitly pblID      => ("Refine_Tacitly", Refine_Tacitly pblID)
    23 | Refine_Problem pblID      => ("Refine_Problem", Refine_Problem pblID)
    24 | Add_Given cterm'          => ("Add_Given", Add_Given cterm') 
    25 | Del_Given cterm'          => ("Del_Given", Del_Given cterm') 
    26 | Add_Find cterm'           => ("Add_Find", Add_Find cterm') 
    27 | Del_Find cterm'           => ("Del_Find", Del_Find cterm') 
    28 | Add_Relation cterm'       => ("Add_Relation", Add_Relation cterm') 
    29 | Del_Relation cterm'       => ("Del_Relation", Del_Relation cterm') 
    30 
    31 | Specify_Theory domID	    => ("Specify_Theory", Specify_Theory domID) 
    32 | Specify_Problem pblID     => ("Specify_Problem", Specify_Problem pblID)
    33 | Specify_Method metID	    => ("Specify_Method", Specify_Method metID) 
    34 | Apply_Method metID	    => ("Apply_Method", Apply_Method metID) 
    35 | Check_Postcond pblID	    => ("Check_Postcond", Check_Postcond pblID)
    36 | Free_Solve                => ("Free_Solve",Free_Solve)
    37 		    
    38 | Rewrite_Inst (subs, thm') => ("Rewrite_Inst", Rewrite_Inst (subs, thm')) 
    39 | Rewrite thm'		    => ("Rewrite", Rewrite thm') 
    40 | Rewrite_Asm thm'	    => ("Rewrite_Asm", Rewrite_Asm thm') 
    41 | Rewrite_Set_Inst (subs, rls')
    42                => ("Rewrite_Set_Inst", Rewrite_Set_Inst (subs, rls')) 
    43 | Rewrite_Set rls'          => ("Rewrite_Set", Rewrite_Set rls') 
    44 | End_Ruleset		    => ("End_Ruleset", End_Ruleset)
    45 
    46 | End_Detail                => ("End_Detail", End_Detail)
    47 | Detail_Set rls'           => ("Detail_Set", Detail_Set rls')
    48 | Detail_Set_Inst (s, rls') => ("Detail_Set_Inst", Detail_Set_Inst (s, rls'))
    49 
    50 | Calculate op_             => ("Calculate", Calculate op_)
    51 | Substitute sube           => ("Substitute", Substitute sube) 
    52 | Apply_Assumption cts'	    => ("Apply_Assumption", Apply_Assumption cts')
    53 
    54 | Take cterm'               => ("Take", Take cterm') 
    55 | Take_Inst cterm'          => ("Take_Inst", Take_Inst cterm') 
    56 | Subproblem (domID, pblID) => ("Subproblem", Subproblem (domID, pblID)) 
    57 (*
    58 | Subproblem_Full(spec,cts')=> ("Subproblem_Full", Subproblem_Full(spec,cts')) 
    59 *)
    60 | End_Subproblem            => ("End_Subproblem",End_Subproblem)
    61 | CAScmd cterm'		    => ("CAScmd", CAScmd cterm')
    62 			    
    63 | Split_And                 => ("Split_And", Split_And) 
    64 | Conclude_And		    => ("Conclude_And", Conclude_And) 
    65 | Split_Or                  => ("Split_Or", Split_Or) 
    66 | Conclude_Or		    => ("Conclude_Or", Conclude_Or) 
    67 | Begin_Trans               => ("Begin_Trans", Begin_Trans) 
    68 | End_Trans		    => ("End_Trans", End_Trans) 
    69 | Begin_Sequ                => ("Begin_Sequ", Begin_Sequ) 
    70 | End_Sequ                  => ("End_Sequ", Begin_Sequ) 
    71 | Split_Intersect           => ("Split_Intersect", Split_Intersect) 
    72 | End_Intersect		    => ("End_Intersect", End_Intersect) 
    73 | Check_elementwise cterm'  => ("Check_elementwise", Check_elementwise cterm')
    74 | Or_to_List                => ("Or_to_List", Or_to_List) 
    75 | Collect_Trues	            => ("Collect_Results", Collect_Trues) 
    76 			    
    77 | Empty_Tac               => ("Empty_Tac",Empty_Tac)
    78 | Tac string              => ("Tac",Tac string)
    79 | End_Proof'                => ("End_Proof'",End_Proof'); 
    80 
    81 (*Detail*)
    82 val empty_tac'_ = (mk_tac'_ Empty_Tac):tac'_;
    83 
    84 fun mk_tac ((_,m):tac'_) = m; 
    85 fun mk_mstID ((mI,_):tac'_) = mI;
    86 
    87 fun tac'_2str ((ID,ms):tac'_) = ID ^ (tac2str ms);
    88 (* TODO: tac2str, tac'_2str NOT tested *)
    89 
    90 
    91 
    92 type squ = ctree; (* TODO: safe etc. *)
    93 
    94 (*13.9.02--------------
    95 type ctr = (loc * pos) list;
    96 val ops = [("PLUS","Groups.plus_class.plus"),("MINUS","Groups.minus_class.minus"),("TIMES","Groups.times_class.times"),
    97 	   ("cancel","cancel"),("pow","pow"),("sqrt","sqrt")];
    98 ML {* 
    99 @{term "PLUS"};   (*Free ("PLUS", "'a") : term*)
   100 @{term "plus"};   (*Const ("Groups.plus_class.plus", "'a => 'a => 'a")*)
   101 @{term "MINUS"};  (*Free ("MINUS", "'a")*)
   102 @{term "minus"};  (*Const ("Groups.minus_class.minus", "'a => 'a => 'a")*)
   103 @{term "TIMES"};  (*Free ("TIMES", "'a")*)
   104 @{term "times"};  (*Const ("Groups.times_class.times", "'a => 'a => 'a")*)
   105 @{term "CANCEL"}; (*Free ("CANCEL", "'a")*)
   106 @{term "cancel"}; (*Free ("cancel", "'a")*)
   107 @{term "POWER"};  (*Free ("POWER", "'a")*)
   108 @{term "pow"};    (*Free ("pow", "'a")*)
   109 @{term "SQRT"};   (*Free ("SQRT", "'a")*)
   110 @{term "sqrt"};   (*Const ("NthRoot.sqrt", "RealDef.real => RealDef.real")*)
   111 *}
   112 fun op_intern op_ =
   113   case assoc (ops, op_) of
   114     SOME op' => op' | NONE => error ("op_intern: no op= "^op_);
   115 -----------------------*)
   116 
   117 
   118 
   119 (* use"ME/solve.sml";
   120    use"solve.sml";
   121 
   122 val ttt = (Thm.term_of o the o (parse thy))"Substitute [(bdv,x)] g";
   123 val ttt = (Thm.term_of o the o (parse thy))"Rewrite thmid True g";
   124 
   125   Const ("Script.Rewrite'_Inst",_) $ sub $ Free (thm',_) $ Const (pa,_) $ f'
   126    *)
   127 
   128 
   129 
   130 val specsteps = ["Init_Proof","Refine_Tacitly","Refine_Problem",
   131 		 "Model_Problem",(*"Match_Problem",*)
   132 		 "Add_Given","Del_Given","Add_Find","Del_Find",
   133 		 "Add_Relation","Del_Relation",
   134 		 "Specify_Theory","Specify_Problem","Specify_Method"];
   135 
   136 
   137 
   138 fun step2taci ((tac_, _, pt, p, _) : Lucin.step) = (*FIXXME.040312: redesign step*)
   139     (Lucin.tac_2tac tac_, tac_, (p, Ctree.get_loc pt p)): Generate.taci;
   140 
   141 
   142 (*FIXME.WN050821 compare solve ... nxt_solv*)
   143 (* val ("Apply_Method",Apply_Method' (mI,_))=(mI,m);
   144    val (("Apply_Method",Apply_Method' (mI,_,_)),pt, pos as (p,_))=(m,pt, pos);
   145    *)
   146 fun solve ("Apply_Method", m as Apply_Method' (mI, _, _, _)) (pt:ctree, (pos as (p,_))) =
   147       let val {srls, ...} = Specify.get_met mI;
   148         val PblObj {meth=itms, ...} = get_obj I pt p;
   149         val thy' = get_obj g_domID pt p;
   150         val thy = assoc_thy thy';
   151         val (is as ScrState (env,_,_,_,_,_), ctxt, sc) = Lucin.init_scrstate thy itms mI;
   152         val ini = Lucin.init_form thy sc env;
   153         val p = lev_dn p;
   154       in 
   155         case ini of
   156 	        SOME t =>
   157             let val (pos,c,_,pt) = 
   158 		          Generate.generate1 thy (Apply_Method' (mI, SOME t, is, ctxt))
   159 			        (is, ctxt) (lev_on p, Frm)(*implicit Take*) pt;
   160 	          in ("ok",([(Apply_Method mI, Apply_Method' (mI, SOME t, is, ctxt), 
   161 		          ((lev_on p, Frm), (is, ctxt)))], c, (pt, pos)) : Chead.calcstate') 
   162 	          end	      
   163 	      | NONE => (*execute the first tac in the Script, compare solve m*)
   164 	          let
   165               val (m', (is', ctxt'), _) = Lucin.next_tac (thy', srls) (pt, (p, Res)) sc (is, ctxt);
   166 	            val d = e_rls (*FIXME: get simplifier from domID*);
   167 	          in 
   168 	            case Lucin.locate_gen (thy',srls) m' (pt,(p, Res)) (sc,d) (is', ctxt') of 
   169 		            Lucin.Steps (is'', ss as (m'',f',pt',p',c')::_) =>
   170 		              ("ok", (map step2taci ss, c', (pt',p')))
   171 		          | NotLocatable =>  
   172 		              let val (p,ps,f,pt) = Generate.generate_hard (assoc_thy "Isac") m (p,Frm) pt;
   173 		              in 
   174 		                ("not-found-in-script",([(Lucin.tac_2tac m, m, (pos, (is, ctxt)))], ps, (pt,p))) 
   175 		              end
   176 	          end
   177       end
   178 
   179   | solve ("Free_Solve", Free_Solve')  (pt,po as (p,_)) =
   180       let (*val _=tracing"###solve Free_Solve";*)
   181         val p' = lev_dn_ (p,Res);
   182         val pt = update_metID pt (par_pblobj pt p) e_metID;
   183       in ("ok", ([(Empty_Tac, Empty_Tac_, (po, (Uistate, e_ctxt)))], [], (pt,p')))
   184       end
   185 
   186   | solve ("Check_Postcond", Check_Postcond' (pI,_)) (pt,(pos as (p,p_))) =
   187       let
   188         val pp = par_pblobj pt p
   189         val asm = 
   190           (case get_obj g_tac pt p of
   191 		         Check_elementwise _ => (*collects and instantiates asms*)
   192 		           (snd o (get_obj g_result pt)) p
   193 		       | _ => get_assumptions_ pt (p,p_))
   194 	        handle _ => [] (*WN.27.5.03 asms in subpbls not completely clear*)
   195         val metID = get_obj g_metID pt pp;
   196         val {srls=srls,scr=sc,...} = Specify.get_met metID;
   197         val loc as (ScrState (E,l,a,_,_,b), ctxt) = get_loc pt (p,p_); 
   198         val thy' = get_obj g_domID pt pp;
   199         val thy = assoc_thy thy';
   200         val (_,_,(scval,scsaf)) = Lucin.next_tac (thy',srls) (pt,(p,p_)) sc loc;
   201       in 
   202         if pp = [] 
   203         then
   204 	        let 
   205             val is = ScrState (E,l,a,scval,scsaf,b)
   206 	          val tac_ = Check_Postcond' (pI, (scval, asm))
   207 	          val (pos,ps,f,pt) = Generate.generate1 thy tac_ (is, ctxt) (pp,Res) pt;
   208 	        in ("ok", ([(Check_Postcond pI, tac_, ((pp,Res),(is, ctxt)))], ps,(pt,pos))) end
   209         else
   210           let (*resume script of parpbl, transfer value of subpbl-script*)
   211             val ppp = par_pblobj pt (lev_up p);
   212 	          val thy' = get_obj g_domID pt ppp;
   213             val thy = assoc_thy thy';
   214 	          val metID = get_obj g_metID pt ppp;
   215             val sc = (#scr o Specify.get_met) metID;
   216             val (ScrState (E,l,a,_,_,b), ctxt') = get_loc pt (pp(*!/p/*),Frm); 
   217 	          val ctxt'' = from_subpbl_to_caller ctxt scval ctxt'
   218             val ((p,p_),ps,f,pt) = 
   219 	            Generate.generate1 thy (Check_Postcond' (pI, (scval, asm)))
   220 		            (ScrState (E,l,a,scval,scsaf,b), ctxt'') (pp,Res) pt;
   221        in ("ok", ([(Check_Postcond pI, Check_Postcond'(pI,(scval, asm)),
   222 	         ((pp,Res), (ScrState (E,l,a,scval,scsaf,b), ctxt'')))],ps,(pt,(p,p_))))
   223 	     end
   224      end
   225 
   226   | solve (_,End_Proof'') (pt, (p,p_)) =
   227       ("end-proof",
   228        ([(Empty_Tac,Empty_Tac_,(([],Res),(Uistate, e_ctxt)))],[],(pt,(p,p_))))
   229 
   230 (*-----------vvvvvvvvvvv could be done by generate1 ?!?*)
   231   | solve (_,End_Detail' t) (pt, (p,p_)) =
   232       let
   233         val pr as (p',_) = (lev_up p, Res)
   234 	      val pp = par_pblobj pt p
   235 	      val r = (fst o (get_obj g_result pt)) p' 
   236 	      (*Rewrite_Set* done at Detail_Set*: this result is already in ctree*)
   237 	      val thy' = get_obj g_domID pt pp
   238 	      val (srls, is, sc) = Lucin.from_pblobj' thy' pr pt
   239 	      val (tac_,is',_) = Lucin.next_tac (thy',srls) (pt,pr) sc is
   240       in ("ok", ([(End_Detail, End_Detail' t , 
   241 	      ((p,p_), get_loc pt (p,p_)))], [], (pt,pr)))
   242       end
   243 
   244   | solve (mI,m) (pt, po as (p,p_)) =
   245       if e_metID = get_obj g_metID pt (par_pblobj pt p)(*29.8.02: could be detail, too !!*)
   246       then
   247         let
   248           val ctxt = get_ctxt pt po
   249           val ((p,p_),ps,f,pt) = 
   250 		        Generate.generate1 (assoc_thy (get_obj g_domID pt (par_pblobj pt p))) 
   251 			        m (e_istate, ctxt) (p,p_) pt;
   252 	      in ("no-method-specified", (*Free_Solve*)
   253 	        ([(Empty_Tac,Empty_Tac_, ((p,p_),(Uistate, ctxt)))], ps, (pt,(p,p_))))
   254         end
   255       else
   256 	      let 
   257 	        val thy' = get_obj g_domID pt (par_pblobj pt p);
   258 	        val (srls, is, sc) = Lucin.from_pblobj_or_detail' thy' (p,p_) pt;
   259 		      val d = e_rls; (*FIXME.WN0108: canon.simplifier for domain is missing: generate from domID?*)
   260 	      in
   261           case Lucin.locate_gen (thy',srls) m  (pt,(p,p_)) (sc,d) is of 
   262 	          Lucin.Steps (is', ss as (m',f',pt',p',c')::_) =>
   263 	            let 
   264 	              (*27.8.02:next_tac may change to other branches in pt FIXXXXME*)
   265 	            in ("ok", (map step2taci ss, c', (pt',p'))) end
   266 	        | NotLocatable =>  
   267 	            let val (p,ps,f,pt) = 
   268 		            Generate.generate_hard (assoc_thy "Isac") m (p,p_) pt;
   269 	            in ("not-found-in-script",
   270 		            ([(Lucin.tac_2tac m, m, (po,is))], ps, (pt,p)))
   271               end
   272 	      end;
   273 
   274 (*FIXME.WN050821 compare fun solve ... fun nxt_solv*)
   275 (* nxt_solv (Apply_Method'     vvv FIXME: get args in applicable_in *)
   276 fun nxt_solv (Apply_Method' (mI,_,_,_)) _ (pt:ctree, pos as (p,_)) =
   277       let
   278         val {srls,ppc,...} = Specify.get_met mI;
   279         val PblObj{meth=itms,origin=(oris,_,_),probl, ...} = get_obj I pt p;
   280         val itms = if itms <> [] then itms else Chead.complete_metitms oris probl [] ppc
   281         val thy' = get_obj g_domID pt p;
   282         val thy = assoc_thy thy';
   283         val (is as ScrState (env,_,_,_,_,_), ctxt, scr) = Lucin.init_scrstate thy itms mI;
   284         val ini = Lucin.init_form thy scr env;
   285       in 
   286         case ini of
   287           SOME t =>
   288             let
   289               val pos = ((lev_on o lev_dn) p, Frm)
   290 	            val tac_ = Apply_Method' (mI, SOME t, is, ctxt);
   291 	            val (pos,c,_,pt) = (*implicit Take*)
   292 	              Generate.generate1 thy tac_ (is, ctxt) pos pt
   293             in ([(Apply_Method mI, tac_, (pos, (is, ctxt)))], c, (pt, pos)) : Chead.calcstate' end
   294         | NONE =>
   295             let
   296               val pt = update_env pt (fst pos) (SOME (is, ctxt))
   297 	            val (tacis, c, ptp) = nxt_solve_ (pt, pos)
   298             in (tacis @ 
   299 	              [(Apply_Method mI, Apply_Method' (mI, NONE, e_istate, ctxt), (pos, (is, ctxt)))],
   300 	             c, ptp)
   301             end
   302       end
   303 
   304     (*TODO.WN050913 remove unnecessary code below*)
   305   | nxt_solv (Check_Postcond' (pI,_)) _ (pt, pos as (p,p_))  =
   306       let
   307         val pp = par_pblobj pt p
   308         val asm =
   309           (case get_obj g_tac pt p of
   310 		         Check_elementwise _ => (*collects and instantiates asms*)
   311 		           (snd o (get_obj g_result pt)) p
   312 		       | _ => get_assumptions_ pt (p,p_))
   313 	        handle _ => [] (*FIXME.WN030527 asms in subpbls not completely clear*)
   314         val metID = get_obj g_metID pt pp;
   315         val {srls=srls,scr=sc,...} = Specify.get_met metID;
   316         val loc as (ScrState (E,l,a,_,_,b), ctxt) = get_loc pt (p,p_); 
   317         val thy' = get_obj g_domID pt pp;
   318         val thy = assoc_thy thy';
   319         val (_,_,(scval,scsaf)) = Lucin.next_tac (thy',srls) (pt,(p,p_)) sc loc;
   320       in
   321         if pp = []
   322         then 
   323 	        let
   324             val is = ScrState (E,l,a,scval,scsaf,b)
   325 	          val tac_ = Check_Postcond'(pI,(scval, asm))
   326 	          val ((p,p_),ps,f,pt) = 
   327 		          Generate.generate1 thy tac_ (is, ctxt) (pp,Res) pt;
   328 	        in ([(Check_Postcond pI, tac_, ((pp,Res), (is, ctxt)))],ps,(pt, (p,p_))) end
   329         else
   330           let (*resume script of parpbl, transfer value of subpbl-script*)
   331             val ppp = par_pblobj pt (lev_up p);
   332 	          val thy' = get_obj g_domID pt ppp;
   333             val thy = assoc_thy thy';
   334 	          val metID = get_obj g_metID pt ppp;
   335 	          val {scr,...} = Specify.get_met metID;
   336             val (ScrState (E,l,a,_,_,b), ctxt') = get_loc pt (pp(*!/p/*),Frm)
   337 	          val ctxt'' = from_subpbl_to_caller ctxt scval ctxt'
   338             val tac_ = Check_Postcond' (pI, (scval, asm))
   339 	          val is = ScrState (E,l,a,scval,scsaf,b)
   340             val ((p,p_),ps,f,pt) = Generate.generate1 thy tac_ (is, ctxt'') (pp, Res) pt;
   341           in ([(Check_Postcond pI, tac_, ((pp, Res), (is, ctxt'')))], ps, (pt, (p,p_))) end
   342       end
   343 
   344   | nxt_solv (End_Proof'') _ ptp = ([], [], ptp)
   345 
   346   | nxt_solv tac_ is (pt, pos as (p,p_)) =
   347       let
   348         val pos =
   349           case pos of
   350 		        (p, Met) => ((lev_on o lev_dn) p, Frm)(*begin script*)
   351 		      | (p, Res) => (lev_on p,Res) (*somewhere in script*)
   352 		      | _ => pos
   353 	      val (pos',c,_,pt) = Generate.generate1 (assoc_thy "Isac") tac_ is pos pt;
   354       in ([(Lucin.tac_2tac tac_, tac_, (pos,is))], c, (pt, pos')) end
   355 
   356 (* find the next tac from the script, nxt_solv will update the ctree *)
   357 and nxt_solve_ (ptp as (pt, pos as (p,p_))) =
   358       if e_metID = get_obj g_metID pt (par_pblobj pt p)
   359       then ([], [], (pt, (p, p_))) : Chead.calcstate'
   360       else 
   361         let 
   362           val thy' = get_obj g_domID pt (par_pblobj pt p);
   363 	        val (srls, is, sc) = Lucin.from_pblobj_or_detail' thy' (p,p_) pt;
   364 	        val (tac_,is,(t,_)) = Lucin.next_tac (thy',srls) (pt,pos) sc is;
   365 	        (*TODO here ^^^  return finished/helpless/ok !*)
   366 	      in case tac_ of
   367 		         End_Detail' _ => ([(End_Detail, End_Detail' (t,[(*FIXME.040215*)]), 
   368 				       (pos, is))], [], (pt, pos))
   369 	         | _ => nxt_solv tac_ is ptp end;
   370 
   371 (* says how may steps of a calculation should be done by "fun autocalc" *)
   372 (*FIXXXME040624: does NOT match interfaces/ITOCalc.java
   373   TODO.WN0512 redesign togehter with autocalc ?*)
   374 datatype auto = 
   375   Step of int      (*1 do #int steps (may stop in model/specify)
   376                        IS VERY INEFFICIENT IN MODEL/SPECIY                    *)
   377 | CompleteModel    (*2 complete modeling
   378                        if model complete, finish specifying                   *)
   379 | CompleteCalcHead (*3 complete model/specify in one go                       *)
   380 | CompleteToSubpbl (*4 stop at the next begin of a subproblem,
   381                        if none, complete the actual (sub)problem              *)
   382 | CompleteSubpbl   (*5 complete the actual (sub)problem (incl.ev.subproblems) *)
   383 | CompleteCalc;    (*6 complete the calculation as a whole                    *)
   384 
   385 fun autoord (Step _ ) = 1
   386   | autoord CompleteModel = 2
   387   | autoord CompleteCalcHead = 3
   388   | autoord CompleteToSubpbl = 4
   389   | autoord CompleteSubpbl = 5
   390   | autoord CompleteCalc = 6;
   391 
   392 fun complete_solve auto c (ptp as (_, p as (_,p_)): ctree * pos') =
   393   if p = ([], Res)
   394   then ("end-of-calculation", [], ptp)
   395   else
   396     if member op = [Pbl,Met] p_
   397     then
   398       let
   399         val ptp = Chead.all_modspec ptp
   400 	      val (_, c', ptp) = all_solve auto c ptp
   401 	    in complete_solve auto (c @ c') ptp end
   402     else
   403       case nxt_solve_ ptp of
   404 	      ((Subproblem _, tac_, (_, is))::_, c', ptp') =>
   405 	        if autoord auto < 5
   406           then ("ok", c @ c', ptp)
   407 	        else
   408             let
   409               val ptp = Chead.all_modspec ptp'
   410 	           val (_, c'', ptp) = all_solve auto (c @ c') ptp
   411 	         in complete_solve auto (c @ c'@ c'') ptp end
   412 	    | ((Check_Postcond _, tac_, (_, is))::_, c', ptp' as (_, p')) =>
   413 	        if autoord auto < 6 orelse p' = ([],Res)
   414           then ("ok", c @ c', ptp')
   415 	        else complete_solve auto (c @ c') ptp'
   416 	    | ((End_Detail, _, _)::_, c', ptp') => 
   417 	        if autoord auto < 6
   418           then ("ok", c @ c', ptp')
   419 	        else complete_solve auto (c @ c') ptp'
   420 	    | (_, c', ptp') => complete_solve auto (c @ c') ptp'
   421 
   422 and all_solve auto c (ptp as (pt, pos as (p,_)): ctree * pos') = 
   423   let
   424     val (_,_,mI) = get_obj g_spec pt p
   425     val ctxt = get_ctxt pt pos
   426     val (_, c', ptp) = nxt_solv (Apply_Method' (mI, NONE, e_istate, ctxt)) (e_istate, ctxt) ptp
   427   in complete_solve auto (c @ c') ptp end;
   428 
   429 (* aux.fun for detailrls with Rrls, reverse rewriting *)
   430 fun rul_terms_2nds _ nds t [] = nds
   431   | rul_terms_2nds thy nds t ((rule, res as (t', _)) :: rts) =
   432     (append_atomic [] (e_istate, e_ctxt) t (rule2tac thy [] rule) res Complete EmptyPtree) ::
   433     (rul_terms_2nds thy nds t' rts);
   434 
   435 (* detail steps done internally by Rewrite_Set* into ctree by use of a script *)
   436 fun detailrls pt (pos as (p,p_):pos') = 
   437   let
   438     val t = get_obj g_form pt p
   439 	  val tac = get_obj g_tac pt p
   440 	  val rls = (assoc_rls o rls_of) tac
   441     val ctxt = get_ctxt pt pos
   442   in
   443     case rls of
   444 	    Rrls {scr = Rfuns {init_state,...},...} => 
   445 	      let
   446           val (_,_,_,rul_terms) = init_state t
   447 	        val newnds = rul_terms_2nds (Proof_Context.theory_of ctxt) [] t rul_terms
   448 	        val pt''' = ins_chn newnds pt p 
   449 	      in ("detailrls", pt''', (p @ [length newnds], Res):pos') end
   450 	  | _ =>
   451 	      let
   452           val is = Generate.init_istate tac t
   453 	        (*TODO.WN060602 ScrState (["(t_, Problem (Isac,[equation,univar]))"]
   454 				    is wrong for simpl, but working ?!? *)
   455 	        val tac_ = Apply_Method' (e_metID(*WN0402: see generate1 !?!*), SOME t, is, ctxt)
   456 	        val pos' = ((lev_on o lev_dn) p, Frm)
   457 	        val thy = assoc_thy "Isac"
   458 	        val (_,_,_,pt') = (*implicit Take*)Generate.generate1 thy tac_ (is, ctxt) pos' pt
   459 	        val (_,_,(pt'',_)) = complete_solve CompleteSubpbl [] (pt',pos')
   460 	        val newnds = children (get_nd pt'' p)
   461 	        val pt''' = ins_chn newnds pt p 
   462 	        (*complete_solve cuts branches after*)
   463 	     in ("detailrls", pt''', (p @ [length newnds], Res):pos') end
   464   end;
   465 
   466 
   467 
   468 (* val(mI,m)=m;val ppp=p;(*!!!*)val(p,p_)=pos;val(_,pt,_)=ppp(*!!!*);
   469    get_form ((mI,m):tac'_) ((p,p_):pos') ppp;
   470    *)
   471 fun get_form ((mI,m):tac'_) ((p,p_):pos') pt = 
   472   case Applicable.applicable_in (p,p_) pt m of
   473     Chead.Notappl e => Generate.Error' e
   474   | Chead.Appl m => 
   475       (* val Appl m=applicable_in (p,p_) pt m;
   476          *)
   477       if member op = specsteps mI
   478 	then let val (_,_,f,_,_,_) = Chead.specify m (p,p_) [] pt
   479 	     in f end
   480       else let val (*_,_,f,_,_,_*)_ = solve (mI,m) (pt,(p,p_))
   481 	   in (*f*) Generate.EmptyMout end;
   482  
   483 end