Diff for /gforth/see.fs between versions 1.8 and 1.17

version 1.8, 1995/11/02 14:20:53 version 1.17, 1997/06/01 20:50:39
Line 1 Line 1
 \ SEE.FS       highend SEE for ANSforth                16may93jaw  \ SEE.FS       highend SEE for ANSforth                16may93jaw
   
   \ Copyright (C) 1995 Free Software Foundation, Inc.
   
   \ This file is part of Gforth.
   
   \ Gforth is free software; you can redistribute it and/or
   \ modify it under the terms of the GNU General Public License
   \ as published by the Free Software Foundation; either version 2
   \ of the License, or (at your option) any later version.
   
   \ This program is distributed in the hope that it will be useful,
   \ but WITHOUT ANY WARRANTY; without even the implied warranty of
   \ MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
   \ GNU General Public License for more details.
   
   \ You should have received a copy of the GNU General Public License
   \ along with this program; if not, write to the Free Software
   \ Foundation, Inc., 675 Mass Ave, Cambridge, MA 02139, USA.
   
   
 \ May be cross-compiled  \ May be cross-compiled
   
 \ I'm sorry. This is really not "forthy" enough.  \ I'm sorry. This is really not "forthy" enough.
   
 \ Ideas:        Level should be a stack  \ Ideas:        Level should be a stack
   
   require termsize.fs
   
 decimal  decimal
   
 \ Screen format words                                   16may93jaw  \ Screen format words                                   16may93jaw
Line 29  VARIABLE Level Line 50  VARIABLE Level
 : level-        -7 Level +! ;  : level-        -7 Level +! ;
   
 VARIABLE nlflag  VARIABLE nlflag
   VARIABLE uppercase      \ structure words are in uppercase
   
 DEFER nlcount ' noop IS nlcount  DEFER nlcount ' noop IS nlcount
   
Line 37  DEFER nlcount ' noop IS nlcount Line 59  DEFER nlcount ' noop IS nlcount
                 XPos @ Level @ = ?Exit                  XPos @ Level @ = ?Exit
                 C-Formated @ IF                  C-Formated @ IF
                 C-Output @                  C-Output @
                 IF C-Clearline @ IF 80 XPos @ - spaces                  IF C-Clearline @ IF cols XPos @ - spaces
                                  ELSE cr THEN                                   ELSE cr THEN
                 1 YPos +! 0 XPos !                  1 YPos +! 0 XPos !
                 Level @ spaces                  Level @ spaces
Line 45  DEFER nlcount ' noop IS nlcount Line 67  DEFER nlcount ' noop IS nlcount
   
 : warp?         ( len -- len )  : warp?         ( len -- len )
                 nlflag @ IF (nl) nlflag off THEN                  nlflag @ IF (nl) nlflag off THEN
                 XPos @ over + 79 u> IF (nl) THEN ;                  XPos @ over + cols u>= IF (nl) THEN ;
   
   : c-to-upper
     dup [char] a >= over [char] z <= and if  bl -  then ;
   
 : ctype         ( adr len -- )  : ctype         ( adr len -- )
                 warp? dup XPos +! C-Output @ IF type ELSE 2drop THEN ;                  warp? dup XPos +! C-Output @ 
                   IF uppercase @ IF bounds ?DO i c@ c-to-upper emit LOOP
                                     uppercase off ELSE type THEN
                   ELSE 2drop THEN ;
   
 : cemit         1 warp?  : cemit         1 warp?
                 over bl = Level @ XPos @ = and                  over bl = Level @ XPos @ = and
Line 77  VARIABLE Colors Colors on Line 105  VARIABLE Colors Colors on
 ' (.string) IS .string  ' (.string) IS .string
   
   
 : .struc        Str# .string ;  : .struc        
           uppercase on Str# .string ;
   
 \ CODES                                                 15may93jaw  \ CODES (Branchtypes)                                    15may93jaw
   
 21 CONSTANT RepeatCode  21 CONSTANT RepeatCode
 22 CONSTANT AgainCode  22 CONSTANT AgainCode
Line 89  VARIABLE Colors Colors on Line 118  VARIABLE Colors Colors on
 11 CONSTANT AheadCode  11 CONSTANT AheadCode
 13 CONSTANT WhileCode2  13 CONSTANT WhileCode2
 14 CONSTANT Disable  14 CONSTANT Disable
   15 CONSTANT LeaveCode
   
   
 \ FORMAT WORDS                                          13jun93jaw  \ FORMAT WORDS                                          13jun93jaw
   
 VARIABLE C-Stop  VARIABLE C-Stop
 VARIABLE Branches  VARIABLE Branches
   
 VARIABLE BranchPointer  VARIABLE BranchPointer  \ point to the end of branch table
 VARIABLE SearchPointer  VARIABLE SearchPointer
   
   \ The branchtable consists of three entrys:
   \ address of branch , branch destination , branch type
   
 CREATE BranchTable 500 allot  CREATE BranchTable 500 allot
 here 3 cells -  here 3 cells -
 ACONSTANT MaxTable  ACONSTANT MaxTable
   
 : FirstBranch BranchTable cell+ SearchPointer ! ;  : FirstBranch BranchTable cell+ SearchPointer ! ;
   
 : (BranchAddr?) ( a-addr -- a-addr true | false )  : (BranchAddr?) ( a-addr1 -- a-addr2 true | false )
   \ searches a branch with destination a-addr1
   \ a-addr1: branch destination
   \ a-addr2: pointer in branch table
         SearchPointer @          SearchPointer @
         BEGIN   dup BranchPointer @ u<          BEGIN   dup BranchPointer @ u<
         WHILE          WHILE
Line 132  ACONSTANT MaxTable Line 170  ACONSTANT MaxTable
         2drop true          2drop true
         THEN ;          THEN ;
   
   : MyBranch      ( a-addr -- a-addr a-addr2 )
   \ finds branch table entry for branch at a-addr
                   dup @ over +
                   BranchAddr?
                   BEGIN
                   WHILE 1 cells - @
                         over <>
                   WHILE dup @ over +
                         MoreBranchAddr?
                   REPEAT
                   SearchPointer @ 3 cells -
                   ELSE    true ABORT" SEE: Table failure"
                   THEN ;
   
 \  \
 \                 addrw               addrt  \                 addrw               addrt
 \       BEGIN ... WHILE ... AGAIN ... THEN  \       BEGIN ... WHILE ... AGAIN ... THEN
Line 181  VARIABLE C-Pass Line 233  VARIABLE C-Pass
 : ahead? ( n -- flag ) 0> ;  : ahead? ( n -- flag ) 0> ;
   
 : c-(compile)  : c-(compile)
         Display? IF s" POSTPONE " Com# .string      Display?
                     dup @ look 0= ABORT" SEE: No valid XT"      IF
                     cell+ count $1F and 0 .string bl cemit          s" POSTPONE " Com# .string
                  THEN          dup @ look 0= ABORT" SEE: No valid XT"
         cell+ ;          name>string 0 .string bl cemit
   
 : c-lit  
     Display? IF  
         dup @ dup abs 0 <# #S rot sign #> 0 .string bl cemit  
     THEN  
     cell+ ;  
   
 : c-@local#  
     Display? IF  
         S" @local" 0 .string  
         dup @ dup 1 cells / abs 0 <# #S rot sign #> 0 .string bl cemit  
     THEN  
     cell+ ;  
   
 : c-flit  
     Display? IF  
         dup f@ scratch represent 0=  
         IF    2drop  scratch 3 min 0 .string  
         ELSE  
             IF  '- cemit  THEN  1-  
             scratch over c@ cemit '. cemit 1 /string 0 .string  
             'E cemit  
             dup abs 0 <# #S rot sign #> 0 .string bl cemit  
         THEN THEN  
     float+ ;  
   
 : c-f@local#  
     Display? IF  
         S" f@local" 0 .string  
         dup @ dup 1 floats / abs 0 <# #S rot sign #> 0 .string bl cemit  
     THEN  
     cell+ ;  
   
 : c-laddr#  
     Display? IF  
         S" laddr# " 0 .string  
         dup @ dup abs 0 <# #S rot sign #> 0 .string bl cemit  
     THEN      THEN
     cell+ ;      cell+ ;
   
 : c-lp+!#  : c-lit
     Display? IF      Display? IF
         S" lp+!# " 0 .string  
         dup @ dup abs 0 <# #S rot sign #> 0 .string bl cemit          dup @ dup abs 0 <# #S rot sign #> 0 .string bl cemit
     THEN      THEN
     cell+ ;      cell+ ;
Line 259  VARIABLE C-Pass Line 273  VARIABLE C-Pass
         THEN ;          THEN ;
   
   
 : Forward? ( a-addr true | false -- )  : Forward? ( a-addr true | false -- a-addr true | false )
   \ a-addr1 is pointer into branch table
   \ returns true when jump is a forward jump
         IF      dup dup @ swap 1 cells - @ -          IF      dup dup @ swap 1 cells - @ -
                 Ahead? IF true ELSE drop false THEN                  Ahead? IF true ELSE drop false THEN
                 \ only if forward jump                  \ only if forward jump
         ELSE    false THEN ;          ELSE    false THEN ;
   
 : RepeatCheck  : RepeatCheck ( a-addr1 a-addr2 true | false -- false )
         IF  BEGIN  2dup          IF  BEGIN  2dup
                    1 cells - @ swap dup @ +                     1 cells - @ swap dup @ +
                    u<=                     u<=
Line 304  VARIABLE C-Pass Line 320  VARIABLE C-Pass
                         IF      drop S" REPEAT " .struc nl                          IF      drop S" REPEAT " .struc nl
                         ELSE    S" AGAIN " .struc nl                          ELSE    S" AGAIN " .struc nl
                         THEN                          THEN
                 ELSE    dup cell+ BranchAddr? Forward?                  ELSE    MyBranch cell+ @ LeaveCode =
                         IF      dup cell+ @ WhileCode2 =                          IF      S" LEAVE " .struc
                                 IF nl S" ELSE" .struc level+                          ELSE
                                 ELSE level- nl S" ELSE" .struc level+ THEN                                  dup cell+ BranchAddr? Forward?
                                 cell+ Disable swap !                                  IF      dup cell+ @ WhileCode2 =
                         ELSE    S" AHEAD" .struc level+                                          IF nl S" ELSE" .struc level+
                         THEN                                          ELSE level- nl S" ELSE" .struc level+ THEN
                                           cell+ Disable swap !
                                   ELSE    S" AHEAD" .struc level+
                                   THEN
                           THEN
                 THEN                  THEN
         THEN          THEN
         Debug?          Debug?
Line 318  VARIABLE C-Pass Line 338  VARIABLE C-Pass
         ELSE    cell+          ELSE    cell+
         THEN ;          THEN ;
   
 : MyBranch      ( a-addr -- a-addr a-addr2 )  
                 dup @ over +  
                 BranchAddr?  
                 BEGIN  
                 WHILE 1 cells - @  
                       over <>  
                 WHILE dup @ over +  
                       MoreBranchAddr?  
                 REPEAT  
                 SearchPointer @ 3 cells -  
                 ELSE    true ABORT" SEE: Table failure"  
                 THEN ;  
   
 : DebugBranch  : DebugBranch
         Debug?          Debug?
         IF      dup @ over + swap THEN ; \ return 2 different addresses          IF      dup @ over + swap THEN ; \ return 2 different addresses
Line 353  VARIABLE C-Pass Line 360  VARIABLE C-Pass
                                 level- nl                                  level- nl
                                 S" WHILE " .struc                                  S" WHILE " .struc
                                 level+                                  level+
                         ELSE    nl S" IF " .struc level+                          ELSE    MyBranch cell+ @ LeaveCode =
                                   IF   s" 0= ?LEAVE " .struc
                                   ELSE nl S" IF " .struc level+
                                   THEN
                         THEN                          THEN
                 THEN                  THEN
         THEN          THEN
         DebugBranch          DebugBranch
         cell+ ;          cell+ ;
   
 : c-?branch-lp+!#  c-?branch cell+ ;  
 : c-branch-lp+!#   c-branch  cell+ ;  
   
 : c-do  
         Display? IF nl S" DO" .struc level+ THEN ;  
   
 : c-?do  
         Display? IF nl S" ?DO" .struc level+ THEN  
         DebugBranch cell+ ;  
   
 : c-for  : c-for
         Display? IF nl S" FOR" .struc level+ THEN ;          Display? IF nl S" FOR" .struc level+ THEN ;
   
 : c-next  : .name-without
         Display? IF level- nl S" NEXT " .struc nl THEN  \ prints a name without () e.g. (+LOOP)
         DebugBranch cell+ cell+ ;          dup 1 cells - @ look IF name>string 1 /string 1- .struc ELSE drop THEN ;
   
 : c-loop  : c-loop
         Display? IF level- nl S" LOOP " .struc nl THEN          Display? IF level- nl .name-without bl cemit nl THEN
         DebugBranch cell+ cell+ ;          DebugBranch cell+ 
           Scan? 
           IF      dup BranchAddr? 
                   BEGIN   WHILE cell+ LeaveCode swap !
                           dup MoreBranchAddr?
                   REPEAT
           THEN
           cell+ ;
   
 : c-+loop  : c-do
         Display? IF level- nl S" +LOOP " .struc nl THEN          Display? IF nl .name-without level+ THEN ;
         DebugBranch cell+ cell+ ;  
   : c-?do
 : c-s+loop          Display? IF nl S" ?DO" .struc level+ THEN
         Display? IF level- nl S" S+LOOP " .struc nl THEN          DebugBranch cell+ ;
         DebugBranch cell+ cell+ ;  
   
 : c--loop  
         Display? IF level- nl S" -LOOP " .struc nl THEN  
         DebugBranch cell+ cell+ ;  
   
 : c-next-lp+!#  c-next cell+ ;  
 : c-loop-lp+!#  c-loop cell+ ;  
 : c-+loop-lp+!#  c-+loop cell+ ;  
 : c-s+loop-lp+!#  c-s+loop cell+ ;  
 : c--loop-lp+!#  c--loop cell+ ;  
   
 : c-leave  
         Display? IF S" LEAVE " .struc THEN  
         Debug? IF dup @ + THEN cell+ ;  
   
 : c-?leave  
         Display? IF S" ?LEAVE " .struc THEN  
         cell+ DebugBranch swap cell+ swap cell+ ;  
   
 : c-exit  dup 1 cells -  : c-exit  dup 1 cells -
         CheckEnd          CheckEnd
Line 431  VARIABLE C-Pass Line 419  VARIABLE C-Pass
   
 CREATE C-Table  CREATE C-Table
         ' lit A,            ' c-lit A,          ' lit A,            ' c-lit A,
         ' @local# A,        ' c-@local# A,          ' (s") A,           ' c-s" A,
         ' flit A,           ' c-flit A,          ' (.") A,           ' c-." A,
         ' f@local# A,       ' c-f@local# A,  
         ' laddr# A,         ' c-laddr# A,  
         ' lp+!# A,          ' c-lp+!# A,  
         ' (s") A,           ' c-s" A,  
         ' (.") A,           ' c-." A,  
         ' "lit A,           ' c-c" A,          ' "lit A,           ' c-c" A,
         ' leave A,          ' c-leave A,  
         ' ?leave A,         ' c-?leave A,  
         ' (do) A,           ' c-do A,          ' (do) A,           ' c-do A,
           ' (+do) A,          ' c-do A,
           ' (u+do) A,         ' c-do A,
           ' (-do) A,          ' c-do A,
           ' (u-do) A,         ' c-do A,
         ' (?do) A,          ' c-?do A,          ' (?do) A,          ' c-?do A,
         ' (for) A,          ' c-for A,          ' (for) A,          ' c-for A,
         ' ?branch A,        ' c-?branch A,          ' ?branch A,        ' c-?branch A,
         ' branch A,         ' c-branch A,          ' branch A,         ' c-branch A,
         ' (loop) A,         ' c-loop A,          ' (loop) A,         ' c-loop A,
         ' (+loop) A,        ' c-+loop A,          ' (+loop) A,        ' c-loop A,
         ' (s+loop) A,       ' c-s+loop A,          ' (s+loop) A,       ' c-loop A,
         ' (-loop) A,        ' c--loop A,          ' (-loop) A,        ' c-loop A,
         ' (next) A,         ' c-next A,          ' (next) A,         ' c-loop A,
         ' ?branch-lp+!# A,  ' c-?branch-lp+!# A,  
         ' branch-lp+!# A,   ' c-branch-lp+!# A,  
         ' (loop)-lp+!# A,   ' c-loop-lp+!# A,  
         ' (+loop)-lp+!# A,  ' c-+loop-lp+!# A,  
         ' (s+loop)-lp+!# A, ' c-s+loop-lp+!# A,  
         ' (-loop)-lp+!# A,  ' c--loop-lp+!# A,  
         ' (next)-lp+!# A,   ' c-next-lp+!# A,  
         ' ;s A,             ' c-exit A,          ' ;s A,             ' c-exit A,
         ' (does>) A,        ' c-does> A,          ' (does>) A,        ' c-does> A,
         ' (abort") A,       ' c-abort" A,          ' (abort") A,       ' c-abort" A,
         ' (compile) A,      ' c-(compile) A,          ' (compile) A,      ' c-(compile) A,
         0 ,          0 ,             here 0 ,
   
   avariable c-extender
   c-extender !
   
 \ DOTABLE                                               15may93jaw  \ DOTABLE                                               15may93jaw
   
 : DoTable ( cfa -- flag )  : DoTable ( cfa -- flag )
         C-Table          C-Table
         BEGIN   dup @ dup          BEGIN   dup @ dup 0= 
         WHILE   2 pick <>                  IF drop cell+ @ dup 
                     IF ( next table!) dup @ ELSE 
                           ( end!) 2drop false EXIT THEN 
                   THEN
                   \ jump over to extender, if any 26jan97jaw
                   2 pick <>
         WHILE   2 cells +          WHILE   2 cells +
         REPEAT          REPEAT
         nip cell+ @ EXECUTE          nip cell+ perform
         true          true
         ELSE          ;
         2drop drop false  
         THEN ;  
   
 : BranchTo? ( a-addr -- a-addr )  : BranchTo? ( a-addr -- a-addr )
         Display?  IF     dup BranchAddr?          Display?  IF    dup BranchAddr?
                         IF BEGIN cell+ @ dup 20 u>                          IF
                                   BEGIN cell+ @ dup 20 u>
                                 IF drop nl S" BEGIN " .struc level+                                  IF drop nl S" BEGIN " .struc level+
                                 ELSE                                  ELSE
                                   dup Disable <>                                    dup Disable <> over LeaveCode <> and
                                   IF   WhileCode2 =                                    IF   WhileCode2 =
                                        IF nl S" THEN " .struc nl ELSE                                         IF nl S" THEN " .struc nl ELSE
                                        level- nl S" THEN " .struc nl THEN                                         level- nl S" THEN " .struc nl THEN
Line 500  CREATE C-Table Line 485  CREATE C-Table
         dup >r DoTable r> swap IF drop EXIT THEN          dup >r DoTable r> swap IF drop EXIT THEN
         Display?          Display?
         IF look 0= IF  drop dup 1 cells - @ .  \ ABORT" SEE: Bua!"          IF look 0= IF  drop dup 1 cells - @ .  \ ABORT" SEE: Bua!"
            ELSE  dup cell+ count 31 and rot wordinfo .string  THEN  bl cemit          ELSE
               dup cell+ count dup immediate-mask and
               IF  bl cemit  ." POSTPONE " THEN
               31 and rot wordinfo .string  THEN  bl cemit
         ELSE drop          ELSE drop
         THEN ;          THEN ;
   
Line 512  CREATE C-Table Line 500  CREATE C-Table
         Branches on ;          Branches on ;
   
 : makepass ( a-addr -- )  : makepass ( a-addr -- )
         c-stop off      c-stop off
         BEGIN      BEGIN
                 analyse          analyse
                 c-stop @          c-stop @
         UNTIL drop ;      UNTIL drop ;
   
 DEFER dosee  Defer xt-see-xt ( xt -- )
   \ this one is just a forward declaration for indirect recursion
 : dopri .name ." is primitive" cr ;  
 : dovar ." Variable " .name cr ;  : .defname ( xt c-addr u -- )
 : douse ." User " .name cr ;      rot look
 : docon  dup cell+ (name>) >body @ . ." Constant " .name cr ;      if ( c-addr u nfa )
 : doval  dup cell+ (name>) >body @ . ." Value " .name cr ;          -rot type space .name
 : dodef ." Defer " dup >r .name cr      else
     r@ cell+ (name>) >body @ look          drop ." noname " type
     0= ABORT" SEE: No valid xt in deferred word"      then
     dup dosee cr      space ;
     ." ' " .name r> ." IS " .name cr ;  
 : dodoe ." Create " dup .name cr  Defer discode ( addr -- )
         S" DOES> " Com# .string XPos @ Level ! name>  \  hook for the disassembler: disassemble code at addr (as far as the
         >does-code dup C-Pass @ DebugMode = IF ScanMode c-pass ! EXIT THEN  \  disassembler thinks is sensible)
         ScanMode c-pass ! dup makepass  :noname ( addr -- )
         DisplayMode c-pass ! makepass ;      drop ." ..." ;
 : doali here @ .name ." Alias " .name cr  IS discode
         here @ dosee ;  
 : docol S" : " Com# .string  : seecode ( xt -- )
         dup cell+ count $1F and 2 pick wordinfo .string bl cemit bl cemit      dup s" Code" .defname
         ( XPos @ ) 2 Level !      >body discode
         name> >body      ."  end-code" cr ;
         C-Pass @ DebugMode = IF ScanMode c-pass ! EXIT THEN  : seevar ( xt -- )
         ScanMode c-pass ! dup makepass      s" Variable" .defname cr ;
         DisplayMode c-pass ! makepass ;  : seeuser ( xt -- )
       s" User" .defname cr ;
 create wordtypes  : seecon ( xt -- )
         Pri# ,   ' dopri A,      dup >body ?
         Var# ,   ' dovar A,      s" Constant" .defname cr ;
         Con# ,   ' docon A,  : seevalue ( xt -- )
         Val# ,   ' doval A,      dup >body ?
         Def# ,   ' dodef A,      s" Value" .defname cr ;
         Doe# ,   ' dodoe A,  : seedefer ( xt -- )
         Ali# ,   ' doali A,      dup >body @ xt-see-xt cr
         Col# ,   ' docol A,      dup s" Defer" .defname cr
         Use# ,   ' douse A,      >name dup ??? = if
         0 ,          drop ." lastxt >body !"
       else
 : (dosee) ( lfa -- )          ." IS " .name cr
         dup dup cell+ c@ >r      then ;
         wordinfo  : see-threaded ( addr -- )
         wordtypes      C-Pass @ DebugMode = IF
         BEGIN dup @ dup          ScanMode c-pass !
         WHILE 2 pick = IF cell+ @ nip EXECUTE          EXIT
                           r> dup 32 and IF ."  immediate" THEN      THEN
                                  64 and IF ."  restrict" THEN EXIT THEN      ScanMode c-pass ! dup makepass
               2 cells +      DisplayMode c-pass ! makepass ;
         REPEAT  : seedoes ( xt -- )
         2drop rdrop      dup s" create" .defname cr
         .name ." Don't know how to handle" cr ;      S" DOES> " Com# .string XPos @ Level !
       >does-code see-threaded ;
 ' (dosee) IS dosee  : seecol ( xt -- )
       dup s" :" .defname nl
 : xtc ( xt -- )       \ do see at xt      2 Level !
         Look 0= ABORT" SEE: No valid XT"      >body see-threaded ;
         cr c-init  : seefield ( xt -- )
         dosee ;      dup >body ." 0 " ? ." 0 0 "
       s" Field" .defname cr ;
 : see   name sfind 0= IF ." Word unknown" cr exit THEN  
         xtc ;  : xt-see ( xt -- )
       cr c-init
 : lfc   cr c-init cell+ dosee ;      dup >does-code
 : nfc   cr c-init dosee ;      if
           seedoes EXIT
       then
       dup forthstart u<
       if
           seecode EXIT
       then
       dup >code-address
       CASE
           docon: of seecon endof
           docol: of seecol endof
           dovar: of seevar endof
           douser: of seeuser endof
           dodefer: of seedefer endof
           dofield: of seefield endof
           over >body of seecode endof
           2drop abort" unknown word type"
       ENDCASE ;
   
   : (xt-see-xt) ( xt -- )
       xt-see cr ." lastxt" ;
   ' (xt-see-xt) is xt-see-xt
   
   : (.immediate) ( xt -- )
       ['] execute = if
           ."  immediate"
       then ;
   
   : name-see ( nfa -- )
       dup name>int >r
       dup name>comp 
       over r@ =
       if \ normal or immediate word
           swap xt-see (.immediate)
       else
           r@ ['] compile-only-error =
           if \ compile-only word
               swap xt-see (.immediate) ."  compile-only"
           else \ interpret/compile word
               r@ xt-see-xt cr
               swap xt-see-xt cr
               ." interpret/compile " over .name (.immediate)
           then
       then
       rdrop drop ;
   
   : see ( "name" -- ) \ tools
       name find-name dup 0=
       IF
           drop -&13 bounce
       THEN
       name-see ;
   
   

Removed from v.1.8  
changed lines
  Added in v.1.17


FreeBSD-CVSweb <freebsd-cvsweb@FreeBSD.org>