blah you don't allow your own program extenssion ;)
I've edited file since but with no success
SDF Source:
_______________________________
;Fortran adicional Syntax highlight Script for Twistpad
;1998 - 2006 (C) Carthago Software
[::Header::]
SyntaxName=Fortran
Extensions=F
Spelling=0
SpellingContexts=1;2
CommentChar=!
[Comment1]
Type=StartStop
Context=1
Scope=0
Priority=10
WholeWordOnly=1
First=c
Last=
Background=Default
Foreground=008000
italic=0
[Comment2]
Type=StartStop
Context=1
Scope=0
Priority=10
WholeWordOnly=1
First=!
Last=
Background=Default
Foreground=008000
italic=0
[String1]
Type=StartStop
Context=2
Scope=0
Priority=10
WholeWordOnly=0
First="
Last="
Background=Default
Foreground=800000
[String2]
Type=StartStop
Context=2
Scope=0
Priority=10
WholeWordOnly=0
First='
Last='
Background=Default
Foreground=800000
[blockIF]
Type=StartStop
Context=4
Scope=0
Priority=4
WholeWordOnly=1
First=THEN
Last=ENDIF
Background=Default
Foreground=Default
Outline=1
Smart=1
[blockSubroutine]
Type=StartStop
Context=4
Scope=0
Priority=3
WholeWordOnly=1
First=SUBROUTINE
Last=END
Background=Default
Foreground=Default
Outline=1
Smart=1
[blockDoEnddo]
Type=StartStop
Context=4
Scope=0
Priority=2
WholeWordOnly=1
First=DO
Last=ENDDO
Background=Default
Foreground=808000
Outline=1
[blockDoContinue]
Type=StartStop
Context=4
Scope=0
Priority=3
WholeWordOnly=1
First=DO
Last=CONTINUE
Background=Default
Foreground=8080FF
Outline=1
Smart=1
[Statements Keyword]
Type=keyword
Context=101
Scope=0
Priority=6
WholeWordOnly=1
Keyword1=ALIAS;ALLOCATE;ASSIGN;AUTOMATIC;BACKSPACE;BLOCK;BYTE;C;CALL;C ASE;CHARACTER;CLOSE;COMMON;COMPLEX;CONTINUE;CYCLE;DATA;DEALLOCATE;DIME NSION;DO;DOUBLE;ELSE;END;ENDFILE;ENTRY;EQUIVALENCE;EXIT;EXTERNAL;FORMA T;FUNCTION;GOTO;IF;IMPLICIT;INCLUDE;INQUIRE;INTEGER;INTRINSIC;LOCKING; LOGICAL;MAP;NAMELIST;OPEN;PARAMETER;PAUSE;PRECISION;PRINT;PROGRAM;READ ;REAL;RECORD;REFERENCE;RETURN;REWIND;SAVE;SELECT;STDCALL;STOP;STRUCTUR E;SUBROUTINE;TO;UNION;VALUE;VARYING;WHILE;WRITE
Keyword2=ATTRIBUTES;DECLARE;DEFINE;DEFINED;ELSE;ELSEIF;ENDIF;FIXED;FOR MLINESIZE;FREEFORM;IDENT;IF;INTEGER;MESSAGE;NODECLARE;NOFREEFORM;NOSTR ICT;OBJCOMMENT;OPTIONS;PACK;PSECT;REAL;STRICT;SUBTITLE;THEN;TITLE;UNDE FINE
keyword3=.AND.;.EQ.;.EQV.;.FALSE.;.GT.;.LT.;.NEQV.;.NOT.;.OR.;.TRUE.;. XOR
Background=Default
Foreground=0000FF
Bold=0
________________________________________________
fortran example friend sent me over MSN maybe even outof order I have downloaded fortrans syntax file but since I can't make it work for DO ENDDO CONTINUE problem I haven't read it
this is example I'was testing, eg: there should be indent around 10 or 8 characters (fortran biz), this example renders problem with keywords mentioned above.
_________________________________________________
subroutine allcalc(IWSE,iwsg)
include 'eq_par.inc'
double precision aval
integer iwse ,iwsg ,lokp,lok,ier
logical SG2ERR
c.. calculate present value for all conditions; copied from QSLOAD
C..FIND PRESENT EQUILIBRIUM
LOKP=IQPREQ(IWSE)
IF(SG2ERR(IER))GOTO 900
C..CALCULATE CONDITION VALUES (AND STORE IN THE CONDITION RECORDS.)
LOK=LOKP+M
LOKP=IQPREQ(IWSE)
IF(SG2ERR(IER))GOTO 900
C..CALCULATE CONDITION VALUES (AND STORE IN THE CONDITION RECORDS.)
LOK=LOKP+MBEQRT
300 LOK=IWSE(LOK)
IF(LOK.EQ.0)GOTO 310
IF(IWSE(LOK+MJEQKD).NE.0)THEN
CALL QCNCAL(AVAL,LOK,IWSE,IWSG)
WRITE(*,*) 'CONDITION ',lok,AVAL
c do not prescribe!
CALL STORR1(IWSE(IWSE(LOK+MJPL1)),AVAL)
ENDIF
GOTO 300
310 CONTINUE
DO 40 I=1,NAX
DO 40 j=1,10
I=I+j
ENDDO
40 CONTINUE
C.. CONTINUE
do
continue
write(*,*)
900 return
end
____________________________________________
OFFTOPIC releated to syntax files only:
have this in my defined javascript.sdf file:
_______________
[::Header::]
SyntaxName=Java Script (Dark BG)
Extensions=js
CaseSensitive=1
Spelling=0
SpellingContexts=1;2
CommentChar=//
escapeChar=\
;... string problem
[Quote2]
Type=StartStop
Context=3
Scope=0
Priority=10
WholeWordOnly=0
First='
Last='
Background=Default
Foreground=FFFF00
escapeChar=\
; and brackets problem
[Brackets]
Type=StartStop
Context=4
Scope=0
Priority=4
WholeWordOnly=0
First={
Last=}
Background=Default
Foreground=FFFFFF
escapeChar=\
Outline=1
Smart=1
[ssBrackets]
Type=keyword
Context=1000
Scope=0
Priority=6
WholeWordOnly=0
Keyword1=(;);[;];{;};
Background=Default
Foreground=FF0000
Bold=0
________________________
now string problem is manifested whenever I have two ['] chars next to each other it is like first escapes second eg: '<sometext >''<now this should be text but it is rendered like code>'
but if I enter any char between those two chars it is rendered corectly eg: '<sometext>'+'<now this should be text but it is rendered like code>'
IMG:
blah I've tried to make those bugs with brackets again but with no success, can't remmember exactly what have I've done. But one is it renders brackets in comments, second makes error in twistpad to not recognize brackets anymore, and third makes editor unuable (but only after error something releated to outlines).
could this be releated to syntax above ?
//SolarAngel