Update new styles to use the one defined in Anjuta
[anjuta-extras.git] / plugins / scintilla / properties / styles.properties
blob620eeef09a891d0c18393e7ed390dd3ef69f24aa
1 ###############################################################################
3 # Created by update-properties.pl from all SciTE properties files
5 # This file is divided in 2 parts:
6 #   * The first part concatenate all SciTE *.properties file containing style
7 #     definition but without these definitions. 
8 #   * The second part group all style definitions. The style definition should
9 #     be modified to use anjuta style properties. If the output file already
10 #     exists the second part is read before overwriting it, so you can keep
11 #     any change done here.
15 ###############################################################################
16 # From abaqus.properties
17 # Define SciTE settings for ABAQUS files.
19 file.patterns.abaqus=*.inp;*.dat;*.msg
20 filter.abaqus=ABAQUS input (inp)|$(file.patterns.abaqus)|
22 *filter.abaqus=$(filter.abaqus)
24 #lexer.$(file.patterns.abaqus)=abaqus
25 lexer.$(file.patterns.abaqus)=abaqus
27 # keywords and input/output specifiers
28 keywords=*amplitude *assembly \
29 *beam *boundary *buckle *bulk \
30 *cload *conditions *conductivity *contact \
31 *damping *density *dload *dsflux *dsload *dynamic \
32 *el *elastic *element *element output *elgen *elset *encastre *end step \
33 *expansion *explicit *equation *embedded element \
34 *field *freq *frequency *friction \
35 *generate \
36 *heading *heat transfer *history \
37 *imperfectio *import *include *initial *initial conditions *instance *interactio \
38 *internal *interval \
39 *marks *material *monitor *mpc \
40 *ncopy *nfill *ngen *nlgeom *node *node output *node print *nset *number \
41 *output \
42 *pair *parameter *part *physical constants *plastic *print *preprint \
43 *radiate *restart \
44 *shell *shell section *solid section *specific heat *sradiate *static *step \
45 *surface \
46 *temperature *time *type \
47 *variable *viscosity
49 arguments=elset engineering inc input line material name nset pin tie type write generate field variable history \
50 stefan boltzmann absolute zero zero frequency steady state new old set change number shift \
51 model position newset oldset host
53 keywords.$(file.patterns.abaqus)=
54 keywords2.$(file.patterns.abaqus)=$(keywords)
55 keywords3.$(file.patterns.abaqus)=
56 keywords4.$(file.patterns.abaqus)=
57 keywords5.$(file.patterns.abaqus)=$(arguments)
58 keywords6.$(file.patterns.abaqus)=
60 comment.block.abaqus=**
62 # ABAQUS styles
64 command.compile.*.inp=
65 command.build.*.inp=abaqus job=$(FileName) cpus=4
66 command.go.*.inp=
68 autocomplete.abaqus.ignorecase=1
69 calltip.abaqus.ignorecase=1
73 ###############################################################################
74 # From ada.properties
75 # Define SciTE settings for Ada files.
77 filter.ada=Ada (ads adb)|*.ads;*.adb|
79 *filter.ada=$(filter.ada)
81 file.patterns.ada=*.ads;*.adb
83 *source.patterns.ada=$(file.patterns.ada);
85 lexer.$(file.patterns.ada)=ada
87 *language.ada=Ada|ads||
89 #indent.size.$(file.patterns.ada)=3
90 #use.tabs.$(file.patterns.ada)=0
92 # Keyword except of operator keywords
93 keywordclass.ada.main=abort abstract accept access aliased all array at begin body \
94 case constant declare delay delta digits do else elsif end entry exception exit for \
95 function generic goto if in is limited loop new null of others out package pragma \
96 private procedure protected raise range record renames requeue return reverse \
97 select separate subtype tagged task terminate then type until use when while with
98 # Keywords for operators
99 keywordclass.ada.operators=abs and mod not or rem xor
101 keywordclass.ada=$(keywordclass.ada.main) $(keywordclass.ada.operators)
103 keywords.$(file.patterns.ada)=$(keywordclass.ada)
105 # Ada styles
107 # Comments
108 comment.block.ada=--~
110 braces.ada.style=4
112 statement.indent.$(file.patterns.ada)=1 begin declare else elsif exception for if is loop while
113 statement.lookback.$(file.patterns.ada)=20
114 block.start.$(file.patterns.ada)=10 then is
115 block.end.$(file.patterns.ada)=10 end
117 calltip.ada.word.characters=._$(chars.alpha)
119 adagcc=gcc -c $(FileNameExt)
121 command.compile.*.ads=$(adagcc)
122 command.build.*.ads=gnatmake
123 command.go.*.ads=$(FileName)
125 command.compile.*.adb=$(adagcc)
126 command.build.*.adb=gnatmake
127 command.go.*.adb=$(FileName)
131 ###############################################################################
132 # From asm.properties
133 # Define SciTE settings for Assembler files (NASM)
134 # Originally by Black Horus blackhorus@gmx.net 2002
135 # Updated by Kein-Hong Man mkh@pl.jaring.my 2003-10
136 # Updated by Marat Dukhan (mdukhan3.at.gatech.dot.edu) 10/4/2011
138 # Nasm files
139 file.patterns.asm=*.asm
140 #file.patterns.as=*.s
142 *source.patterns.asm=$(file.patterns.asm);
144 filter.asm=Assembler x86/x64 (asm)|$(file.patterns.asm)|
145 filter.as=Assembler x86/x64 (as)|$(file.patterns.as)|
147 *filter.asm=$(filter.asm)
149 lexer.$(file.patterns.asm)=asm
150 lexer.$(file.patterns.as)=as
152 *language.assembler=Assembler|asm||
154 bcd_instruction=aaa aad aam aas daa das
155 flow_instruction=ja jae jb jbe jc jcxz je jg jge jl jle jmp jna \
156         jnae jnb jnbe jnc jne jng jnge jnl jnle jno jnp jns jnz \
157         jo jp jpe jpo js jz \
158         jcxz jecxz jrcxz \
159         loop loope loopne loopz loopnz \
160         call ret
162 alu_instruction=add sub adc sbb neg cmp inc dec \
163         and or xor not test \
164         shl shr sal sar shld shrd rol ror rcl rcr \
165         cbw cwd cwde cdq cdqe cqo \
166         bsf bsr bt btc btr bts \
167         idiv imul div mul bswap \
168         nop
170 mem_instruction=lea \
171         mov movsx movsxd movzx \
172         xlatb bound \
173         xchg xadd cmpxchg cmpxchg8b cmpxchg16b
175 stack_instruction=push pop pushad popad pushf popf pushfd popfd pushfq popfq
177 pred_instruction=seta setae setb setbe setc sete setg setge setl \
178         setle setna setnae setnb setnbe setnc setne setng setnge \
179         setnl setnle setno setnp setns setnz seto setp setpe setpo \
180         sets setz \
181         salc
183 flag_instruction=clc cld stc std cmc lahf sahf
185 cmov_instruction=cmovo cmovno cmovb cmovc cmovnae cmovae cmovnb \
186         cmovnc cmove cmovz cmovne cmovnz cmovbe cmovna cmova \
187         cmovnbe cmovs cmovns cmovp cmovpe cmovnp cmovpo cmovl \
188         cmovnge cmovge cmovnl cmovle cmovng cmovg cmovnle
190 prefix_instruction=lock rep repe repz repne repnz
192 string_instruction=cmpsb cmpsw cmpsq \
193         movsb movsw movsq \
194         scasb scasw scasd scasq \
195         stosb stosw stosd stosq
197 info_instruction=cpuid rdtsc rdtscp rdpmc xgetbv
199 lwp_instruction=llwpcb slwpcb lwpval lwpins
201 ext_instruction=crc32 popcnt lzcnt tzcnt movbe pclmulqdq rdrand
203 bmi1_instruction=andn bextr blsi blsmk blsr
205 bmi2_instruction=bzhi mulx pdep pext rorx sarx shlx shrx
207 tbm_instruction=blcfill blci blcic blcmsk blcs blsfill blsic t1mskc tzmsk
209 fpu_instruction=f2xm1 fabs fadd faddp fbld fbstp fchs fclex fcom fcomp fcompp fdecstp \
210         fdisi fdiv fdivp fdivr fdivrp feni ffree fiadd ficom ficomp fidiv \
211         fidivr fild fimul fincstp finit fist fistp fisub fisubr fld fld1 \
212         fldcw fldenv fldenvw fldl2e fldl2t fldlg2 fldln2 fldpi fldz fmul \
213         fmulp fnclex fndisi fneni fninit fnop fnsave fnsavew fnstcw fnstenv \
214         fnstenvw fnstsw fpatan fprem fptan frndint frstor frstorw fsave \
215         fsavew fscale fsqrt fst fstcw fstenv fstenvw fstp fstsw fsub fsubp \
216         fsubr fsubrp ftst fwait fxam fxch fxtract fyl2x fyl2xp1 \
217         fsetpm fcos fldenvd fnsaved fnstenvd fprem1 frstord fsaved fsin fsincos \
218         fstenvd fucom fucomp fucompp fcomi fcomip fucomi fucomip ffreep \
219         fcmovb fcmove fcmovbe fcmovu fcmovnb fcmovne fcmovnbe fcmovnu
221 mmx_instruction=movd movq \
222         paddb paddw paddd paddsb paddsw paddusb paddusw \
223         psubb psubw psubd psubsb psubsw psubusb psubusw \
224         pand pandn por pxor \
225         pcmpeqb pcmpeqd pcmpeqw pcmpgtb pcmpgtd pcmpgtw \
226         pmaddwd pmulhw pmullw \
227         psllw pslld psllq psrlw psrld psrlq psraw psrad \
228         packuswb packsswb packssdw \
229         punpcklbw punpcklwd punpckldq punpckhbw punpckhwd punpckhdq \
230         emms
232 mmx2_instruction=pavgb pavgw \
233         pextrw pinsrw pmovmskb \
234         pmaxsw pmaxub pminsw pminub \
235         pmulhuw psadbw pshufw \
236         prefetchnta prefetcht0 prefetcht1 prefetcht2 \
237         maskmovq movntq sfence
239 emmx_instruction=paddsiw psubsiw \
240         pmulhrw pmachriw pmulhriw \
241         pmagw pdistib paveb \
242         pmvzb pmvnzb pmvlzb pmvgezb
244 k3d_instruction=pfacc pfadd pfsub pfsubr pfmul \
245         pfcmpeq pfcmpge pfcmpgt \
246         pfmax pfmin \
247         pfrcp pfrcpit1 pfrcpit2 pfrsqit1 pfrsqrt \
248         pi2fd pf2id \
249         pavgusb pmulhrw \
250         femms
252 k3d2_instruction=pfnacc pfpnacc pi2fw pf2iw pswapd
254 k3dgeode_instruction=pfrsqrtv pfrcpv
256 k3dprefetch_instruction=prefetch prefetchw
258 sse_instruction=addss addps subss subps \
259         mulss mulps divss divps sqrtss sqrtps \
260         rcpss rcpps rsqrtss rsqrtps \
261         maxss maxps minss minps \
262         cmpss comiss ucomiss cmpps \
263         cmpeqss cmpltss cmpless cmpunordss cmpneqss cmpnltss cmpnless cmpordss \
264         cmpeqps cmpltps cmpleps cmpunordps cmpneqps cmpnltps cmpnleps cmpordps \
265         andnps andps orps xorps \
266         cvtsi2ss cvtss2si cvttss2si \
267         cvtpi2ps cvtps2pi cvttps2pi \
268         movss movlps movhps movlhps movhlps movaps movups movntps movmskps \
269         shufps unpckhps unpcklps \
270         ldmxcsr stmxcsr
272 sse2_instruction=addpd addsd subpd subsd \
273         mulsd mulpd divsd divpd sqrtsd sqrtpd \
274         maxsd maxpd minsd minpd \
275         cmpsd comisd ucomisd cmppd \
276         cmpeqsd cmpltsd cmplesd cmpunordsd cmpneqsd cmpnltsd cmpnlesd cmpordsd \
277         cmpeqpd cmpltpd cmplepd cmpunordpd cmpneqpd cmpnltpd cmpnlepd cmpordpd \
278         andnpd andpd orpd xorpd \
279         cvtsd2ss cvtpd2ps cvtss2sd cvtps2pd \
280         cvtdq2ps cvtps2dq cvttps2dq \
281         cvtdq2pd cvtpd2dq cvttpd2dq \
282         cvtsi2sd cvtsd2si cvttsd2si \
283         cvtpi2pd cvtpd2pi cvttpd2pi \
284         movsd movlpd movhpd movapd movupd movntpd movmskpd \
285         shufpd unpckhpd unpcklpd \
286         movnti movdqa movdqu movntdq maskmovdqu \
287         movdq2q movq2dq \
288         paddq psubq pmuludq \
289         pslldq psrldq \
290         punpcklqdq punpckhqdq \
291         pshufhw pshuflw pshufd \
292         lfence mfence
294 sse3_instruction=addsubps addsubpd \
295         haddps haddpd hsubps hsubpd \
296         movsldup movshdup movddup \
297         lddqu \
298         fisttp
300 ssse3_instruction=psignb psignw psignd \
301         pabsb pabsw pabsd \
302         palignr pshufb \
303         pmulhrsw pmaddubsw \
304         phaddw phaddd phaddsw \
305         phsubw phsubd phsubsw
307 sse4a_instruction=extrq insertq \
308         movntsd movntss
310 sse41_instruction=mpsadbw phminposuw \
311         pmuldq pmulld \
312         dpps dppd \
313         blendps blendpd blendvps blendvpd pblendvb pblendw \
314         pmaxsb pmaxuw pmaxsd pmaxud pminsb pminuw pminsd pminud \
315         roundps roundss roundpd roundsd \
316         insertps pinsrb pinsrd pinsrq \
317         extractps pextrb pextrd pextrq \
318         pmovsxbw pmovsxbd pmovsxbq pmovsxwd pmovsxwq pmovsxdq \
319         pmovzxbw pmovzxbd pmovzxbq pmovzxwd pmovzxwq pmovzxdq \
320         ptest \
321         pcmpeqq \
322         packusdw \
323         movntdqa
325 sse42_instruction=pcmpgtq \
326         pcmpestri pcmpestrm pcmpistri pcmpistrm
328 aes_instruction=aesenc aesenclast aesdec aesdeclast aeskeygenassist aesimc
330 padlock_instruction=xcryptcbc xcryptcfb xcryptctr xcryptecb xcryptofb \
331         xsha1 xsha256 montmul xstore
334 avx_instruction=vaddss vaddps vaddsd vaddpd vsubss vsubps vsubsd vsubpd \
335         vaddsubps vaddsubpd \
336         vhaddps vhaddpd vhsubps vhsubpd \
337         vmulss vmulps vmulsd vmulpd \
338         vmaxss vmaxps vmaxsd vmaxpd vminss vminps vminsd vminpd \
339         vandps vandpd vandnps vandnpd vorps vorpd vxorps vxorpd \
340         vblendps vblendpd vblendvps vblendvpd \
341         vcmpss vcomiss vucomiss vcmpsd vcomisd vucomisd vcmpps vcmppd \
342         vcmpeqss vcmpltss vcmpless vcmpunordss vcmpneqss vcmpnltss vcmpnless vcmpordss \
343         vcmpeq_uqss vcmpngess vcmpngtss vcmpfalsess vcmpneq_oqss vcmpgess vcmpgtss vcmptruess \
344         vcmpeq_osss vcmplt_oqss vcmple_oqss vcmpunord_sss vcmpneq_usss vcmpnlt_uqss vcmpnle_uqss vcmpord_sss \
345         vcmpeq_usss vcmpnge_uqss vcmpngt_uqss vcmpfalse_osss vcmpneq_osss vcmpge_oqss vcmpgt_oqss vcmptrue_usss \
346         vcmpeqps vcmpltps vcmpleps vcmpunordps vcmpneqps vcmpnltps vcmpnleps vcmpordps \
347         vcmpeq_uqps vcmpngeps vcmpngtps vcmpfalseps vcmpneq_oqps vcmpgeps vcmpgtps vcmptrueps \
348         vcmpeq_osps vcmplt_oqps vcmple_oqps vcmpunord_sps vcmpneq_usps vcmpnlt_uqps vcmpnle_uqps vcmpord_sps \
349         vcmpeq_usps vcmpnge_uqps vcmpngt_uqps vcmpfalse_osps vcmpneq_osps vcmpge_oqps vcmpgt_oqps vcmptrue_usps \
350         vcmpeqsd vcmpltsd vcmplesd vcmpunordsd vcmpneqsd vcmpnltsd vcmpnlesd vcmpordsd \
351         vcmpeq_uqsd vcmpngesd vcmpngtsd vcmpfalsesd vcmpneq_oqsd vcmpgesd vcmpgtsd vcmptruesd \
352         vcmpeq_ossd vcmplt_oqsd vcmple_oqsd vcmpunord_ssd vcmpneq_ussd vcmpnlt_uqsd vcmpnle_uqsd vcmpord_ssd \
353         vcmpeq_ussd vcmpnge_uqsd vcmpngt_uqsd vcmpfalse_ossd vcmpneq_ossd vcmpge_oqsd vcmpgt_oqsd vcmptrue_ussd \
354         vcmpeqpd vcmpltpd vcmplepd vcmpunordpd vcmpneqpd vcmpnltpd vcmpnlepd vcmpordpd \
355         vcmpeq_uqpd vcmpngepd vcmpngtpd vcmpfalsepd vcmpneq_oqpd vcmpgepd vcmpgtpd vcmptruepd \
356         vcmpeq_ospd vcmplt_oqpd vcmple_oqpd vcmpunord_spd vcmpneq_uspd vcmpnlt_uqpd vcmpnle_uqpd vcmpord_spd \
357         vcmpeq_uspd vcmpnge_uqpd vcmpngt_uqpd vcmpfalse_ospd vcmpneq_ospd vcmpge_oqpd vcmpgt_oqpd vcmptrue_uspd \
358         vcvtsd2ss vcvtpd2ps vcvtss2sd vcvtps2pd \
359         vcvtsi2ss vcvtss2si vcvttss2si \
360         vcvtpi2ps vcvtps2pi vcvttps2pi \
361         vcvtdq2ps vcvtps2dq vcvttps2dq \
362         vcvtdq2pd vcvtpd2dq vcvttpd2dq \
363         vcvtsi2sd vcvtsd2si vcvttsd2si \
364         vcvtpi2pd vcvtpd2pi vcvttpd2pi \
365         vdivss vdivps vdivsd vdivpd vsqrtss vsqrtps vsqrtsd vsqrtpd \
366         vdpps vdppd \
367         vmaskmovps vmaskmovpd \
368         vmovss vmovsd vmovaps vmovapd vmovups vmovupd vmovntps vmovntpd \
369         vmovhlps vmovlhps vmovlps vmovlpd vmovhps vmovhpd \
370         vmovsldup vmovshdup vmovddup \
371         vmovmskps vmovmskpd \
372         vroundss vroundps vroundsd vroundpd \
373         vrcpss vrcpps vrsqrtss vrsqrtps \
374         vunpcklps vunpckhps vunpcklpd vunpckhpd \
375         vbroadcastss vbroadcastsd vbroadcastf128 \
376         vextractps vinsertps vextractf128 vinsertf128 \
377         vshufps vshufpd vpermilps vpermilpd vperm2f128 \
378         vtestps vtestpd \
379         vpaddb vpaddusb vpaddsb vpaddw vpaddusw vpaddsw vpaddd vpaddq \
380         vpsubb vpsubusb vpsubsb vpsubw vpsubusw vpsubsw vpsubd vpsubq \
381         vphaddw vphaddsw vphaddd vphsubw vphsubsw vphsubd \
382         vpsllw vpslld vpsllq vpsrlw vpsrld vpsrlq vpsraw vpsrad \
383         vpand vpandn vpor vpxor \
384         vpblendwb vpblendw \
385         vpsignb vpsignw vpsignd \
386         vpavgb vpavgw \
387         vpabsb vpabsw vpabsd \
388         vmovd vmovq vmovdqa vmovdqu vlddqu vmovntdq vmovntdqa vmaskmovdqu \
389         vpmovsxbw vpmovsxbd vpmovsxbq vpmovsxwd vpmovsxwq vpmovsxdq \
390         vpmovzxbw vpmovzxbd vpmovzxbq vpmovzxwd vpmovzxwq vpmovzxdq \
391         vpackuswb vpacksswb vpackusdw vpackssdw \
392         vpcmpeqb vpcmpeqw vpcmpeqd vpcmpeqq vpcmpgtb vpcmpgtw vpcmpgtd vpcmpgtq \
393         vpmaddubsw vpmaddwd \
394         vpmullw vpmulhuw vpmulhw vpmulhrsw vpmulld vpmuludq vpmuldq \
395         vpmaxub vpmaxsb vpmaxuw vpmaxsw vpmaxud vpmaxsd \
396         vpminub vpminsb vpminuw vpminsw vpminud vpminsd \
397         vpmovmskb vptest \
398         vpunpcklbw vpunpcklwd vpunpckldq vpunpcklqdq \
399         vpunpckhbw vpunpckhwd vpunpckhdq vpunpckhqdq \
400         vpslldq vpsrldq vpalignr \
401         vpshufb vpshuflw vpshufhw vpshufd \
402         vpextrb vpextrw vpextrd vpextrq vpinsrb vpinsrw vpinsrd vpinsrq \
403         vpsadbw vmpsadbw vphminposuw \
404         vpcmpestri vpcmpestrm vpcmpistri vpcmpistrm \
405         vpclmulqdq vaesenc vaesenclast vaesdec vaesdeclast vaeskeygenassist vaesimc \
406         vldmxcsr vstmxcsr vzeroall vzeroupper
408 avx2_instruction=vbroadcasti128 vpbroadcastb vpbroadcastw vpbroadcastd vpbroadcastq \
409         vpblendd \
410         vpermd vpermq vperm2i128 \
411         vextracti128 vinserti128 \
412         vpmaskmovd vpmaskmovq \
413         vpsllvd vpsllvq vpsravd vpsrlvd vpsrldq \
414         vpgatherdd vpgatherqd vgatherdq vgatherqq \
415         vpermps vpermpd \
416         vgatherdpd vgatherqpd vgatherdps vgatherqps
418 xop_instruction=vfrczss vfrczps vfrczsd vfrczpd \
419         vpermil2ps vperlil2pd \
420         vtestps vtestpd \
421         vpcomub vpcomb vpcomuw vpcomw vpcomud vpcomd vpcomuq vpcomq \
422         vphaddubw vphaddbw vphaddubd vphaddbd vphaddubq vphaddbq \
423         vphadduwd vphaddwd vphadduwq vphaddwq vphaddudq vphadddq \
424         vphsubbw vphsubwd vphsubdq \
425         vpmacsdd vpmacssdd vpmacsdql vpmacssdql vpmacsdqh vpmacssdqh \
426         vpmacsww vpmacssww vpmacswd vpmacsswd \
427         vpmadcswd vpmadcsswd \
428         vpcmov vpperm \
429         vprotb vprotw vprotd vprotq \
430         vpshab vpshaw vpshad vpshaq \
431         vpshlb vpshlw vpshld vpshlq
433 cvt16_instruction=vcvtph2ps vcvtps2ph
435 fma4_instruction=vfmaddss vfmaddps vfmaddsd vfmaddpd \
436         vfmsubss vfmsubps vfmsubsd vfmsubpd \
437         vnfmaddss vnfmaddps vnfmaddsd vnfmaddpd \
438         vnfmsubss vnfmsubps vnfmsubsd vnfmsubpd \
439         vfmaddsubps vfmaddsubpd vfmsubaddps vfmsubaddpd
441 fma3_instruction=vfmadd132ss vfmadd213ss vfmadd231ss \
442         vfmadd132ps vfmadd213ps vfmadd231ps \
443         vfmadd132sd vfmadd213sd vfmadd231sd \
444         vfmadd132pd vfmadd213pd vfmadd231pd \
445         vfmaddsub132ps vfmaddsub213ps vfmaddsub231ps \
446         vfmaddsub132pd vfmaddsub213pd vfmaddsub231pd \
447         vfmsubadd132ps vfmsubadd213ps vfmsubadd231ps \
448         vfmsubadd132pd vfmsubadd213pd vfmsubadd231pd \
449         vfmsub132ss vfmsub213ss vfmsub231ss \
450         vfmsub132ps vfmsub213ps vfmsub231ps \
451         vfmsub132sd vfmsub213sd vfmsub231sd \
452         vfmsub132pd vfmsub213pd vfmsub231pd \
453         vfnmadd132ss vfnmadd213ss vfnmadd231ss \
454         vfnmadd132ps vfnmadd213ps vfnmadd231ps \
455         vfnmadd132sd vfnmadd213sd vfnmadd231sd \
456         vfnmadd132pd vfnmadd213pd vfnmadd231pd \
457         vfnmsub132ss vfnmsub213ss vfnmsub231ss \
458         vfnmsub132ps vfnmsub213ps vfnmsub231ps \
459         vfnmsub132sd vfnmsub213sd vfnmsub231sd \
460         vfnmsub132pd vfnmsub213pd vfnmsub231pd
462 register=al ah bl bh cl ch dl dh \
463         ax bx cx dx si di bp \
464         eax ebx ecx edx esi edi ebx esp \
465         st0 st1 st2 st3 st4 st5 st6 st7 \
466         mm0 mm1 mm2 mm3 mm4 mm5 mm6 mm7 \
467         xmm0 xmm1 xmm2 xmm3 xmm4 xmm5 xmm6 xmm7 \
468         ymm0 ymm1 ymm2 ymm3 ymm4 ymm5 ymm6 ymm7 \
469         fs
471 register_64=sil dil bpl \
472         r8b r9b r10b r11b r12b r13b r14b r15b \
473         r8w r9w r10w r11w r12w r13w r14w r15w \
474         rax rcx rdx rbx rsp rbp rsi rdi \
475         r8 r9 r10 r11 r12 r13 r14 r15 \
476         xmm8 xmm9 xmm10 xmm11 xmm12 xmm13 xmm14 xmm15 \
477         ymm8 ymm9 ymm10 ymm11 ymm12 ymm13 ymm14 ymm15 \
478         gs
480 directive_nasm=db dw dd dq dt do dy \
481         resb resw resd resq rest reso resy incbin equ times safeseh \
482         __utf16__ __utf32__ %+ \
483         default cpu float start imagebase osabi \
484         ..start ..imagebase ..gotpc ..gotoff ..gottpoff ..got ..plt ..sym ..tlsie \
485         section segment __sect__ group absolute \
486         .bss .comment .data .lbss .ldata .lrodata .rdata .rodata .tbss .tdata .text \
487         alloc bss code exec data noalloc nobits noexec nowrite progbits rdata tls write \
488         private public common stack overlay class \
489         extern global common import export \
490         %define %idefine %xdefine %ixdefine %assign %undef %? %?? \
491         %defstr %idefstr %deftok %ideftok \
492         %strcat %strlen %substr \
493         %macro %imacro %rmacro %exitmacro %endmacro %unmacro \
494         %if %ifn %elif %elifn %else %endif \
495         %ifdef %ifndef %elifdef %elifndef \
496         %ifmacro %ifnmacro %elifmacro %elifnmacro \
497         %ifctx %ifnctx %elifctx %elifnctx \
498         %ifidn %ifnidn %elifidn %elifnidn \
499         %ifidni %ifnidni %elifidni %elifnidni \
500         %ifid %ifnid %elifid %elifnid \
501         %ifnum %ifnnum %elifnum %elifnnum \
502         %ifstr %ifnstr %elifstr %elifnstr \
503         %iftoken %ifntoken %eliftoken %elifntoken \
504         %ifempty %elifempty %ifnempty %elifnempty \
505         %ifenv %ifnenv %elifenv %elifnenv \
506         %rep %exitrep %endrep \
507         %while %exitwhile %endwhile \
508         %include %pathsearch %depend %use \
509         %push %pop %repl %arg %local %stacksize flat flat64 large small \
510         %error %warning %fatal \
511         %00 .nolist %rotate %line %! %final %clear \
512         struc endstruc istruc at iend \
513         align alignb sectalign \
514         bits use16 use32 use64 \
515         __nasm_major__ __nasm_minor__ __nasm_subminor__ ___nasm_patchlevel__ \
516         __nasm_version_id__ __nasm_ver__ \
517         __file__ __line__ __pass__ __bits__ __output_format__ \
518         __date__ __time__ __date_num__ __time_num__ __posix_time__ \
519         __utc_date__ __utc_time__ __utc_date_num__ __utc_time_num__ \
520         __float_daz__ __float_round__ __float__ \
521         __use_altreg__ altreg \
522         __use_smartalign__ smartalign __alignmode__ \
523         __use_fp__ __infinity__ __nan__ __qnan__ __snan__ \
524         __float8__ __float16__ __float32__ __float64__ __float80m__ __float80e__ __float128l__ __float128h__
526 directive_operand_nasm=a16 a32 a64 o16 o32 o64 strict \
527         byte word dword qword tword oword yword nosplit \
528         %0 %1 %2 %3 %4 %5 %6 %7 %8 %9 \
529         abs rel \
530         $ $$ \
531         seg wrt
533 keywords.$(file.patterns.asm)=$(bcd_instruction) $(flow_instruction) $(alu_instruction) $(mem_instruction) $(stack_instruction) $(pred_instruction) $(flag_instruction) $(cmov_instruction) $(prefix_instruction) $(string_instruction) $(info_instruction) $(lwp_instruction) $(ext_instruction) $(bmi1_instruction) $(bmi2_instruction)
534 keywords2.$(file.patterns.asm)=$(fpu_instruction)
535 keywords3.$(file.patterns.asm)=$(register) $(register_64)
536 keywords4.$(file.patterns.asm)=$(directive_nasm)
537 keywords5.$(file.patterns.asm)=$(directive_operand_nasm)
538 keywords6.$(file.patterns.asm)=$(mmx_instruction) $(mmx2_instruction) $(emmx_instruction) $(k3d_instruction) $(k3d2_instruction) $(k3dgeode_instruction) $(k3dprefetch_instruction) $(sse_instruction) $(sse2_instruction) $(sse3_instruction) $(ssse3_instruction) $(sse4a_instruction) $(sse41_instruction) $(sse42_instruction) $(aes_instruction) $(padlock_instruction) $(avx_instruction) $(avx2_instruction) $(xop_instruction) $(cvt16_instruction) $(fma4_instruction) $(fma3_instruction)
540 keywords.$(file.patterns.as)=$(bcd_instruction) $(flow_instruction) $(alu_instruction) $(mem_instruction) $(stack_instruction) $(pred_instruction) $(flag_instruction) $(cmov_instruction) $(prefix_instruction) $(string_instruction) $(info_instruction) $(lwp_instruction) $(ext_instruction) $(bmi1_instruction) $(bmi2_instruction)
541 keywords2.$(file.patterns.as)=$(fpu_instruction)
542 keywords3.$(file.patterns.as)=$(register) $(register_64)
543 keywords4.$(file.patterns.as)=$(directive_nasm)
544 keywords5.$(file.patterns.as)=$(directive_operand_nasm)
545 keywords6.$(file.patterns.as)=$(mmx_instruction) $(mmx2_instruction) $(emmx_instruction) $(k3d_instruction) $(k3d2_instruction) $(k3dgeode_instruction) $(k3dprefetch_instruction) $(sse_instruction) $(sse2_instruction) $(sse3_instruction) $(ssse3_instruction) $(sse4a_instruction) $(sse41_instruction) $(sse42_instruction) $(aes_instruction) $(padlock_instruction) $(avx_instruction) $(avx2_instruction) $(xop_instruction) $(cvt16_instruction) $(fma4_instruction) $(fma3_instruction)
547 comment.block.asm=;
548 comment.block.as=#
551 # Assembler Styles
552 #$(colour.code.comment.line),font:Comic Sans MS,size:8
553 #fore:#0000ff
556 command.compile.$(file.patterns.asm)=nasm $(FileNameExt)
558 command.name.0.*.asm=Link
559 command.0.*.asm=link $(FileName)
562 statement.indent.$(file.patterns.asm)=9 .if
563 statement.indent.$(file.patterns.as)=9 .if
567 ###############################################################################
568 # From asn1.properties
569 # Define SciTE settings for ASN.1 MIB definition files.
571 filter.asn1=ASN.1 (asn1)|*.mib|
573 *filter.asn1=$(filter.asn1)
575 file.patterns.asn1=*.mib
577 lexer.$(file.patterns.asn1)=asn1
579 *language.asn=ASN.1|mib||
581 # ASN.1 styles
583 # Keywords
584 keywords.$(file.patterns.asn1)=\
585 ACCESS AGENT AUGMENTS \
586 BEGIN BITS \
587 CAPABILITIES CHOICE COMPLIANCE CONTACT CONVENTION \
588 DEFINITIONS DEFVAL DESCRIPTION DISPLAY \
589 END ENTERPRISE EXPORTS \
590 FALSE FROM \
591 GROUP GROUPS \
592 HINT \
593 IDENTITY IMPLIED IMPORTS INCLUDES INDEX INFO \
594 LAST \
595 MANDATORY MAX MIN MODULE \
596 NOTATION NOTIFICATION NULL \
597 OBJECTS OBJECT-TYPE OF ORGANIZATION \
598 PRODUCT \
599 RELEASE REFERENCE REQUIRES REVISION \
600 SEQUENCE SIZE STATUS SUPPORTS SYNTAX \
601 TEXTUAL TRAP TYPE TRAP-TYPE \
602 UPDATED \
603 VALUE VARIABLES VARIATION \
604 WRITE
606 # Attributes
607 keywords2.$(file.patterns.asn1)=\
608 accessible \
609 create current \
610 deprecated \
611 for \
612 mandatory \
613 not notify not-accessible \
614 obsolete only optional \
615 read read-only read-write \
616 write
618 # Descriptors
619 keywords3.$(file.patterns.asn1)=\
620 ABSENT ANY APPLICATION \
621 BIT BOOLEAN BY \
622 COMPONENT COMPONENTS \
623 DEFAULT DEFINED \
624 ENUMERATED EXPLICIT EXTERNAL \
625 IMPLICIT INIFINITY \
626 MAX MIN MINUS \
627 OPTIONAL \
628 PRESENT PRIVATE \
629 REAL \
630 SET \
631 TAGS TRUE
633 # Types
634 keywords4.$(file.patterns.asn1)=\
635 Counter Counter32 Counter64 \
636 DisplayString \
637 Gauge Gauge32 \
638 IDENTIFIER INTEGER Integer32 IpAddress \
639 NetworkAddress NsapAddress \
640 OBJECT OCTET Opaque \
641 PhysAddress \
642 STRING \
643 TimeTicks \
644 UInteger32 UNITS Unsigned32
649 ###############################################################################
650 # From au3.properties
651 # Define SciTE settings for AutoIt files.
653 # SciTE settings for AutoIt 3.3.14.2
655 # File filters, patterns, language, lexer and source
656 file.patterns.au3=*.au3
657 filter.au3=AutoIt (au3)|$(file.patterns.au3)|
658 lexer.$(file.patterns.au3)=au3
660 *filter.au3=$(filter.au3)
661 *language.au3=AutoIt|au3||
662 *source.patterns.au3=$(file.patterns.au3);
664 # Autocomplete and CallTip
665 autocomplete.au3.ignorecase=1
666 autocomplete.au3.start.characters=$(chars.alpha)$(chars.numeric)_@#$
667 calltip.au3.end.definition=)
668 calltip.au3.ignorecase=1
669 calltip.au3.use.escapes=1
670 calltip.au3.word.characters=$(chars.alpha)$(chars.numeric)_.
671 word.characters.$(file.patterns.au3)=$(chars.alpha)$(chars.numeric)$(chars.accented)_@#$.
673 # Indentation
674 indent.size.$(file.patterns.au3)=4
675 tab.size.$(file.patterns.au3)=4
676 use.tabs.$(file.patterns.au3)=1
678 block.start.$(file.patterns.au3)=5\
679  case if do for func else elseif while select switch with\
680  Case If Do For Func Else ElseIf While Select Switch With\
681  CASE IF DO FOR FUNC ELSE ELSEIF WHILE SELECT SWITCH WITH
683 block.end.$(file.patterns.au3)=5\
684  case else endif elseif endfunc endselect endswitch next until wend endwith\
685  Case Else EndIf ElseIf EndFunc EndSelect EndSwitch Next Until WEnd EndWith Wend\
686  CASE ELSE ENDIF ELSEIF ENDFUNC ENDSELECT ENDSWITCH NEXT UNTIL WEND ENDWITH
688 # Comment Block, Box and Stream
689 comment.block.au3=;~
690 comment.block.at.line.start.au3=1
691 comment.box.start.au3=#cs
692 comment.box.middle.au3=;
693 comment.box.end.au3=#ce
694 comment.stream.start.au3=#cs
695 comment.stream.end.au3=#ce
697 # Au3 keywords
698 # Imported Scite4AutoIt3 files may resolve i.e. $(au3.variables.used) as keyword values
700 # Keyword
701 keywords.$(file.patterns.au3)=and byref case const continuecase continueloop default dim\
702  do else elseif endfunc endif endselect endswitch endwith enum exit exitloop false\
703  for func global if in local next not null or redim return select static step switch\
704  then to true until volatile wend while with
706 # Function
707 keywords2.$(file.patterns.au3)=abs acos adlibregister adlibunregister asc ascw asin assign\
708  atan autoitsetoption autoitwingettitle autoitwinsettitle beep binary binarylen binarymid\
709  binarytostring bitand bitnot bitor bitrotate bitshift bitxor blockinput break call\
710  cdtray ceiling chr chrw clipget clipput consoleread consolewrite consolewriteerror\
711  controlclick controlcommand controldisable controlenable controlfocus controlgetfocus\
712  controlgethandle controlgetpos controlgettext controlhide controllistview controlmove\
713  controlsend controlsettext controlshow controltreeview cos dec dircopy dircreate\
714  dirgetsize dirmove dirremove dllcall dllcalladdress dllcallbackfree dllcallbackgetptr\
715  dllcallbackregister dllclose dllopen dllstructcreate dllstructgetdata dllstructgetptr\
716  dllstructgetsize dllstructsetdata drivegetdrive drivegetfilesystem drivegetlabel\
717  drivegetserial drivegettype drivemapadd drivemapdel drivemapget drivesetlabel drivespacefree\
718  drivespacetotal drivestatus envget envset envupdate eval execute exp filechangedir\
719  fileclose filecopy filecreatentfslink filecreateshortcut filedelete fileexists filefindfirstfile\
720  filefindnextfile fileflush filegetattrib filegetencoding filegetlongname filegetpos\
721  filegetshortcut filegetshortname filegetsize filegettime filegetversion fileinstall\
722  filemove fileopen fileopendialog fileread filereadline filereadtoarray filerecycle\
723  filerecycleempty filesavedialog fileselectfolder filesetattrib filesetend filesetpos\
724  filesettime filewrite filewriteline floor ftpsetproxy funcname guicreate guictrlcreateavi\
725  guictrlcreatebutton guictrlcreatecheckbox guictrlcreatecombo guictrlcreatecontextmenu\
726  guictrlcreatedate guictrlcreatedummy guictrlcreateedit guictrlcreategraphic guictrlcreategroup\
727  guictrlcreateicon guictrlcreateinput guictrlcreatelabel guictrlcreatelist guictrlcreatelistview\
728  guictrlcreatelistviewitem guictrlcreatemenu guictrlcreatemenuitem guictrlcreatemonthcal\
729  guictrlcreateobj guictrlcreatepic guictrlcreateprogress guictrlcreateradio guictrlcreateslider\
730  guictrlcreatetab guictrlcreatetabitem guictrlcreatetreeview guictrlcreatetreeviewitem\
731  guictrlcreateupdown guictrldelete guictrlgethandle guictrlgetstate guictrlread guictrlrecvmsg\
732  guictrlregisterlistviewsort guictrlsendmsg guictrlsendtodummy guictrlsetbkcolor guictrlsetcolor\
733  guictrlsetcursor guictrlsetdata guictrlsetdefbkcolor guictrlsetdefcolor guictrlsetfont\
734  guictrlsetgraphic guictrlsetimage guictrlsetlimit guictrlsetonevent guictrlsetpos\
735  guictrlsetresizing guictrlsetstate guictrlsetstyle guictrlsettip guidelete guigetcursorinfo\
736  guigetmsg guigetstyle guiregistermsg guisetaccelerators guisetbkcolor guisetcoord\
737  guisetcursor guisetfont guisethelp guiseticon guisetonevent guisetstate guisetstyle\
738  guistartgroup guiswitch hex hotkeyset httpsetproxy httpsetuseragent hwnd inetclose\
739  inetget inetgetinfo inetgetsize inetread inidelete iniread inireadsection inireadsectionnames\
740  inirenamesection iniwrite iniwritesection inputbox int isadmin isarray isbinary isbool\
741  isdeclared isdllstruct isfloat isfunc ishwnd isint iskeyword isnumber isobj isptr\
742  isstring log memgetstats mod mouseclick mouseclickdrag mousedown mousegetcursor mousegetpos\
743  mousemove mouseup mousewheel msgbox number objcreate objcreateinterface objevent\
744  objevent objget objname onautoitexitregister onautoitexitunregister opt ping pixelchecksum\
745  pixelgetcolor pixelsearch processclose processexists processgetstats processlist\
746  processsetpriority processwait processwaitclose progressoff progresson progressset\
747  ptr random regdelete regenumkey regenumval regread regwrite round run runas runaswait\
748  runwait send sendkeepactive seterror setextended shellexecute shellexecutewait shutdown\
749  sin sleep soundplay soundsetwavevolume splashimageon splashoff splashtexton sqrt\
750  srandom statusbargettext stderrread stdinwrite stdioclose stdoutread string stringaddcr\
751  stringcompare stringformat stringfromasciiarray stringinstr stringisalnum stringisalpha\
752  stringisascii stringisdigit stringisfloat stringisint stringislower stringisspace\
753  stringisupper stringisxdigit stringleft stringlen stringlower stringmid stringregexp\
754  stringregexpreplace stringreplace stringreverse stringright stringsplit stringstripcr\
755  stringstripws stringtoasciiarray stringtobinary stringtrimleft stringtrimright stringupper\
756  tan tcpaccept tcpclosesocket tcpconnect tcplisten tcpnametoip tcprecv tcpsend tcpshutdown\
757  tcpstartup timerdiff timerinit tooltip traycreateitem traycreatemenu traygetmsg trayitemdelete\
758  trayitemgethandle trayitemgetstate trayitemgettext trayitemsetonevent trayitemsetstate\
759  trayitemsettext traysetclick trayseticon traysetonevent traysetpauseicon traysetstate\
760  traysettooltip traytip ubound udpbind udpclosesocket udpopen udprecv udpsend udpshutdown\
761  udpstartup vargettype winactivate winactive winclose winexists winflash wingetcaretpos\
762  wingetclasslist wingetclientsize wingethandle wingetpos wingetprocess wingetstate\
763  wingettext wingettitle winkill winlist winmenuselectitem winminimizeall winminimizeallundo\
764  winmove winsetontop winsetstate winsettitle winsettrans winwait winwaitactive winwaitclose\
765  winwaitnotactive
767 # Macro
768 keywords3.$(file.patterns.au3)=@appdatacommondir @appdatadir @autoitexe @autoitpid @autoitversion\
769  @autoitx64 @com_eventobj @commonfilesdir @compiled @computername @comspec @cpuarch\
770  @cr @crlf @desktopcommondir @desktopdepth @desktopdir @desktopheight @desktoprefresh\
771  @desktopwidth @documentscommondir @error @exitcode @exitmethod @extended @favoritescommondir\
772  @favoritesdir @gui_ctrlhandle @gui_ctrlid @gui_dragfile @gui_dragid @gui_dropid @gui_winhandle\
773  @homedrive @homepath @homeshare @hotkeypressed @hour @ipaddress1 @ipaddress2 @ipaddress3\
774  @ipaddress4 @kblayout @lf @localappdatadir @logondnsdomain @logondomain @logonserver\
775  @mday @min @mon @msec @muilang @mydocumentsdir @numparams @osarch @osbuild @oslang\
776  @osservicepack @ostype @osversion @programfilesdir @programscommondir @programsdir\
777  @scriptdir @scriptfullpath @scriptlinenumber @scriptname @sec @startmenucommondir\
778  @startmenudir @startupcommondir @startupdir @sw_disable @sw_enable @sw_hide @sw_lock\
779  @sw_maximize @sw_minimize @sw_restore @sw_show @sw_showdefault @sw_showmaximized\
780  @sw_showminimized @sw_showminnoactive @sw_showna @sw_shownoactivate @sw_shownormal\
781  @sw_unlock @systemdir @tab @tempdir @tray_id @trayiconflashing @trayiconvisible @username\
782  @userprofiledir @wday @windowsdir @workingdir @yday @year
784 # Send key
785 keywords4.$(file.patterns.au3)={!} {#} {^} {{} {}} {+} {alt} {altdown} {altup} {appskey}\
786  {asc} {backspace} {break} {browser_back} {browser_favorites} {browser_forward} {browser_home}\
787  {browser_refresh} {browser_search} {browser_stop} {bs} {capslock} {ctrldown} {ctrlup}\
788  {del} {delete} {down} {end} {enter} {esc} {escape} {f1} {f10} {f11} {f12} {f2} {f3}\
789  {f4} {f5} {f6} {f7} {f8} {f9} {home} {ins} {insert} {lalt} {launch_app1} {launch_app2}\
790  {launch_mail} {launch_media} {lctrl} {left} {lshift} {lwin} {lwindown} {lwinup} {media_next}\
791  {media_play_pause} {media_prev} {media_stop} {numlock} {numpad0} {numpad1} {numpad2}\
792  {numpad3} {numpad4} {numpad5} {numpad6} {numpad7} {numpad8} {numpad9} {numpadadd}\
793  {numpaddiv} {numpaddot} {numpadenter} {numpadmult} {numpadsub} {oem_102} {pause}\
794  {pgdn} {pgup} {printscreen} {ralt} {rctrl} {right} {rshift} {rwin} {rwindown} {rwinup}\
795  {scrolllock} {shiftdown} {shiftup} {sleep} {space} {tab} {up} {volume_down} {volume_mute}\
796  {volume_up}
798 # Pre-Processor
799 keywords5.$(file.patterns.au3)=#ce #comments-end #comments-start #cs #include #include-once\
800 #notrayicon #onautoitstartregister #requireadmin
802 # Special
803 keywords6.$(file.patterns.au3)=#endregion #forcedef #forceref #ignorefunc #pragma #region\
804  $(autoit3wrapper.keywords.special)
806 # Abbrev-Expand
807 keywords7.$(file.patterns.au3)=$(au3.keywords.abbrev) $(au3.keywords.userabbrev)
809 # Standard UDF
810 keywords8.$(file.patterns.au3)=$(au3.keywords.udfs)
812 # Au3 styles
815 # Properties using paths
817 # Directory containing AutoIt program files
818 autoit3dir=$(SciteDefaultHome)\..
820 # API path
821 api.$(file.patterns.au3)=$(SciteDefaultHome)\api\au3.api;$(SciteDefaultHome)\api\au3.autoit3wrapper.api;$(SciteUserHome)\au3.user.calltips.api
823 # Commands for F1 Help
824 command.help.$(file.patterns.au3)=$(CurrentWord)!$(autoit3dir)\AutoIt.chm
825 command.help.subsystem.$(file.patterns.au3)=4
827 # Commands to Compile, Build and Go
828 command.compile.$(file.patterns.au3)="$(autoit3dir)\Aut2Exe\Aut2exe.exe" /in "$(FilePath)"
829 command.build.$(file.patterns.au3)="$(autoit3dir)\Aut2Exe\Aut2exe.exe" /in "$(FilePath)" /x64
830 command.go.$(file.patterns.au3)="$(autoit3dir)\AutoIt3.exe" /ErrorStdOut "$(FilePath)" $(1) $(2) $(3) $(4)
832 # Au3Check
833 command.0.$(file.patterns.au3)="$(autoit3dir)\Au3Check.exe" -q "$(FilePath)"
834 command.name.0.$(file.patterns.au3)=Syntax Check
835 command.shortcut.0.$(file.patterns.au3)=Ctrl+F5
836 command.save.before.0.$(file.patterns.au3)=1
840 ###############################################################################
841 # From ave.properties
842 # Define SciTE settings for Avenue files.
844 filter.ave=AVE (ave)|*.ave|
846 *filter.ave=$(filter.ave)
848 file.patterns.ave=*.ave
850 lexer.*.ave=ave
851 lexer.$(file.patterns.ave)=ave
853 *language.avenue=Avenue|ave||
855 ####################################################
856 # import classes and requests
857 # files ave.classes &  ave.funcs is to large
858 #import ave.classes
859 #import ave.funcs
861 keywords.$(file.patterns.ave)=nil true false else for if while then elseif end av self in exit
862 #keywords2.$(file.patterns.ave)=$(keywordclass.ave)
863 #keywords3.$(file.patterns.ave)=$(keywordfunc.ave)
864 word.chars.ave=$(chars.alpha)$(chars.numeric)_#
865 word.characters.$(file.patterns.ave)=$(word.chars.ave)
867 statement.indent.$(file.patterns.ave)=1 else for if while then
868 statement.lookback.$(file.patterns.ave)=1 end
870 #Avenue string not support tab symbol, if You use tabs in script all tabs automatic translated to space.
871 #use.tabs=0
873 ####################################################
874 #Load user-defined api for current project.
875 #api.$(file.patterns.ave)=ave.api
876 ####################################################
878 comment.block.ave='--
880 comment.box.start.ave='--
881 comment.box.middle.ave='--
882 comment.box.end.ave='--
883 #Avenue is not case-sensitive lang.
884 autocomplete.ave.ignorecase=1
885 calltip.ave.ignorecase=1
886 autocomplete.ave.start.characters=.
887 calltip.ave.word.characters=.$(word.chars.ave)
889 # AVE styles
890 ############################################################
891 # Braces are only matched in operator style
892 braces.ave.style=10
893 ############################################################
896 avenue=ave "$(FilePath)"
897 avenueGo=avego "$(FilePath)"
898 avenueBuild=avebuild "$(FilePath)"
900 ################################################################
901 #use winhlp32 system
902 #if ArcView installed in other directory please correct path <C:\ESRI\AV_GIS30\ARCVIEW\HELP\ARCVIEW>
903 #command.help.$(file.patterns.ave)=$(CurrentWord)!C:\ESRI\AV_GIS30\ARCVIEW\HELP\ARCVIEW
904 #command.help.subsystem.$(file.patterns.ave)=5
907 #~ # compile
908 #~ command.compile.$(file.patterns.ave)=$(avenue)
909 #~ command.go.$(file.patterns.ave)=$(avenueGo)
910 #~ #send to arcview
911 #~ command.name.0.*.ave=Insert into project
912 #~ command.0.*.ave=$(avenueBuild)
913 #~ command.subsystem.0.*.ave=1
915 #~ command.name.1.*.ave=Variables Report
916 #~ command.1.*.ave=VarsReport.exe  "$(FilePath)"
920 ###############################################################################
921 # From avs.properties
922 # Define SciTE settings for AviSynth scripts.
924 file.patterns.avs=*.avs;*.avsi
926 filter.avs=AviSynth (avs avsi)|$(file.patterns.avs)|
928 lexer.$(file.patterns.avs)=avs
930 word.chars.avs=$(chars.alpha)$(chars.numeric)_#
931 word.characters.$(file.patterns.avs)=$(word.chars.avs)
933 autocomplete.avs.ignorecase=1
934 autocomplete.avs.fillups=(
935 calltip.avs_quote.ignorecase=1
936 calltip.avs.word.characters=$(word.chars.avs)
938 comment.block.at.line.start.avs=1
939 comment.block.avs=#~
940 comment.stream.start.avs=/*
941 comment.stream.end.avs=*/
942 comment.box.start.avs=/*
943 comment.box.middle.avs= *
944 comment.box.end.avs= */
946 # Keywords
947 keywords.$(file.patterns.avs)=true false return global
949 # Filters
950 keywords2.$(file.patterns.avs)=addborders alignedsplice amplify amplifydb animate applyrange assumebff \
951 assumefieldbased assumefps assumeframebased assumesamplerate assumescaledfps assumetff audiodub audiodubex \
952 avifilesource avisource bicubicresize bilinearresize blackmanresize blackness blankclip blur bob cache \
953 changefps colorbars colorkeymask coloryuv compare complementparity conditionalfilter conditionalreader \
954 convertaudio convertaudioto16bit convertaudioto24bit convertaudioto32bit convertaudioto8bit convertaudiotofloat \
955 convertbacktoyuy2 convertfps converttobackyuy2 converttomono converttorgb converttorgb24 converttorgb32 \
956 converttoy8 converttoyv16 converttoyv24 converttoyv411 converttoyuy2 converttoyv12 crop cropbottom delayaudio \
957 deleteframe dissolve distributor doubleweave duplicateframe ensurevbrmp3sync fadein fadein0 fadein2 fadeio fadeio0 \
958 fadeio2 fadeout fadeout0 fadeout2 fixbrokenchromaupsampling fixluminance fliphorizontal flipvertical frameevaluate \
959 freezeframe gaussresize generalconvolution getchannel getchannels getmtmode getparity grayscale greyscale histogram \
960 horizontalreduceby2 imagereader imagesource imagewriter info interleave internalcache internalcachemt invert killaudio \
961 killvideo lanczos4resize lanczosresize layer letterbox levels limiter loop mask maskhs max merge mergeargb mergechannels \
962 mergechroma mergeluma mergergb messageclip min mixaudio monotostereo normalize null opendmlsource overlay peculiarblend \
963 pointresize pulldown reduceby2 resampleaudio resetmask reverse rgbadjust scriptclip segmentedavisource segmenteddirectshowsource \
964 selecteven selectevery selectodd selectrangeevery separatefields setmtmode sharpen showalpha showblue showfiveversions \
965 showframenumber showgreen showred showsmpte showtime sincresize skewrows spatialsoften spline16resize spline36resize \
966 spline64resize ssrc stackhorizontal stackvertical subtitle subtract supereq swapfields swapuv temporalsoften timestretch \
967 tone trim turn180 turnleft turnright tweak unalignedsplice utoy utoy8 version verticalreduceby2 vtoy vtoy8 wavsource \
968 weave writefile writefileend writefileif writefilestart ytouv
970 # Plugins
971 keywords3.$(file.patterns.avs)=addgrain addgrainc agc_hdragc analyzelogo animeivtc asharp audiograph autocrop \
972 autoyuy2 avsrecursion awarpsharp bassaudiosource bicublinresize bifrost binarize blendfields blindpp blockbuster \
973 bordercontrol cfielddiff cframediff chromashift cnr2 colormatrix combmask contra convolution3d convolution3dyv12 \
974 dctfilter ddcc deblendlogo deblock deblock_qed decimate decomb dedup deen deflate degrainmedian depan depanestimate \
975 depaninterleave depanscenes depanstabilize descratch despot dfttest dgbob dgsource directshowsource distancefunction \
976 dss2 dup dupmc edeen edgemask ediupsizer eedi2 eedi3 eedi3_rpow2 expand faerydust fastbicubicresize fastbilinearresize \
977 fastediupsizer dedgemask fdecimate ffaudiosource ffdshow ffindex ffmpegsource ffmpegsource2 fft3dfilter fft3dgpu \
978 ffvideosource fielddeinterlace fielddiff fillmargins fity2uv fity2u fity2v fitu2y fitv2y fluxsmooth fluxsmoothst fluxsmootht \
979 framediff framenumber frfun3b frfun7 gicocu golddust gradfun2db grapesmoother greedyhma grid guavacomb hqdn3d hybridfupp \
980 hysteresymask ibob improvesceneswitch inflate inpand inpaintlogo interframe interlacedresize interlacedwarpedresize \
981 interleaved2planar iscombed iscombedt iscombedtivtc kerneldeint leakkernelbob leakkerneldeint limitedsharpen limitedsharpenfaster \
982 logic lsfmod lumafilter lumayv12 manalyse maskeddeinterlace maskedmerge maskedmix mblockfps mcompensate mctemporaldenoise \
983 mctemporaldenoisepp mdegrain1 mdegrain2 mdegrain3 mdepan medianblur mergehints mflow mflowblur mflowfps mflowinter minblur mipsmooth \
984 mmask moderatesharpen monitorfilter motionmask mpasource mpeg2source mrecalculate mscdetection msharpen mshow msmooth msu_fieldshiftfixer \
985 msu_frc msuper mt mt_adddiff mt_average mt_binarize mt_circle mt_clamp mt_convolution mt_deflate mt_diamond mt_edge mt_ellipse \
986 mt_expand mt_freeellipse mt_freelosange mt_freerectangle mt_hysteresis mt_infix mt_inflate mt_inpand mt_invert mt_logic mt_losange \
987 mt_lut mt_lutf mt_luts mt_lutspa mt_lutsx mt_lutxy mt_lutxyz mt_makediff mt_mappedblur mt_merge mt_motion mt_polish mt_rectangle \
988 mt_square mti mtsource multidecimate mvanalyse mvblockfps mvchangecompensate mvcompensate mvdegrain1 mvdegrain2 mvdegrain3 mvdenoise \
989 mvdepan mvflow mvflowblur mvflowfps mvflowfps2 mvflowinter mvincrease mvmask mvrecalculate mvscdetection mvshow nicac3source nicdtssource \
990 niclpcmsource nicmpasource nicmpg123source nnedi nnedi2 nnedi2_rpow2 nnedi3 nnedi3_rpow2 nomosmooth overlaymask peachsmoother pixiedust \
991 planar2interleaved qtgmc qtinput rawavsource rawsource reduceflicker reinterpolate411 removedirt removedust removegrain removegrainhd \
992 removetemporalgrain repair requestlinear reversefielddominance rgb3dlut rgdeinterlace rgsdeinterlace rgblut rotate sangnom seesaw sharpen2 \
993 showchannels showcombedtivtc smartdecimate smartdeinterlace smdegrain smoothdeinterlace smoothuv soothess soxfilter spacedust sshiq ssim \
994 ssiq stmedianfilter t3dlut tanisotropic tbilateral tcanny tcomb tcombmask tcpserver tcpsource tdecimate tdeint tedgemask telecide \
995 temporalcleaner temporalrepair temporalsmoother tfieldblank tfm tisophote tivtc tmaskblank tmaskedmerge tmaskedmerge3 tmm tmonitor tnlmeans \
996 tomsmocomp toon textsub ttempsmooth ttempsmoothf tunsharp unblock uncomb undot unfilter unsharpmask vaguedenoiser variableblur verticalcleaner \
997 videoscope vinverse vobsub vqmcalc warpedresize warpsharp xsharpen yadif yadifmod yuy2lut yv12convolution yv12interlacedreduceby2 \
998 yv12interlacedselecttopfields yv12layer yv12lut yv12lutxy yv12substract yv12torgb24 yv12toyuy2
1000 # Functions
1001 keywords4.$(file.patterns.avs)=abs apply assert bool ceil chr clip continueddenominator continuednumerator cos default defined \
1002 eval averagechromau averagechromav averageluma chromaudifference chromavdifference lumadifference exist exp findstr float floor \
1003 frac hexvalue import int isbool isclip isfloat isint isstring lcase leftstr load_stdcall_plugin loadcplugin loadplugin loadvfapiplugin \
1004 loadvirtualdubplugin log midstr muldiv nop opt_allowfloataudio opt_avipadscanlines opt_dwchannelmask opt_usewaveextensible \
1005 opt_vdubplanarhack pi pow rand revstr rightstr round scriptdir scriptfile scriptname select setmemorymax setplanarlegacyalignment \
1006 rgbdifference rgbdifferencefromprevious rgbdifferencetonext udifferencefromprevious udifferencetonext setworkingdir sign sin spline \
1007 sqrt string strlen time ucase undefined value versionnumber versionstring uplanemax uplanemedian uplanemin uplaneminmaxdifference \
1008 vdifferencefromprevious vdifferencetonext vplanemax vplanemedian vplanemin vplaneminmaxdifference ydifferencefromprevious \
1009 ydifferencetonext yplanemax yplanemedian yplanemin yplaneminmaxdifference
1011 # Clip properties
1012 keywords5.$(file.patterns.avs)=audiobits audiochannels audiolength audiolengthf audiorate framecount framerate frameratedenominator \
1013 frameratenumerator getleftchannel getrightchannel hasaudio hasvideo height isaudiofloat isaudioint isfieldbased isframebased \
1014 isinterleaved isplanar isrgb isrgb24 isrgb32 isyuv isyuy2 isyv12 width
1016 # User defined
1017 keywords6.$(file.patterns.avs)=
1019 # AviSynth Styles
1021 # Braces are only matched in operator style
1022 braces.avs.style=5
1026 ###############################################################################
1027 # From baan.properties
1028 # Define SciTE settings for Baan files.
1029 #set Below as per Preference.
1030 font.baan.monospace=font:Consolas,size:10
1032 fold.baan.keywords.based=1
1033 fold.baan.syntax.based=0
1034 fold.baan.sections=1
1035 fold.baan.inner.level=0
1036 lexer.baan.styling.within.preprocessor=1
1038 #uncomment below, set the full path of API files. If more than one, seperate it with ';'.
1039 #api.$(file.patterns.baan)=
1041 #Uncomment below two properties, set the full path of CHM files.
1042 #command.help.$(file.patterns.baan)=$(CurrentWord)!D:\
1043 #command.help.subsystem.$(file.patterns.baan)=4
1045 #Not much to change.  Check Baan Styles for preference.
1046 file.patterns.baan=*.bc;*.cln
1048 filter.baan=Baan (baan)|$(file.patterns.baan)|
1050 *filter.baan=$(filter.baan)
1052 lexer.$(file.patterns.baan)=baan
1054 *language.baan=Baan|bc||
1056 word.characters.$(file.patterns.baan)=$(chars.alpha)$(chars.numeric)_#.$
1057 calltip.baan.word.characters=$(chars.alpha)$(chars.numeric)_#.$
1058 autocomplete.baan.ignorecase=1
1059 calltip.baan.ignorecase=1
1060 autocomplete.baan.start.characters="abcdefghijklmnopqrstuvwxyzABCDEFGHIJKLMNOPQRSTUVWXYZ_."
1062 preprocessor.symbol.$(file.patterns.baan)=#
1063 preprocessor.start.$(file.patterns.baan)=if ifdef ifndef
1064 preprocessor.middle.$(file.patterns.baan)=else elif
1065 preprocessor.end.$(file.patterns.baan)=endif
1067 # Comment blocks for Baan
1068 comment.block.baan=|
1069 comment.block.at.line.start.baan=1
1071 block.start.$(file.patterns.baan)=4 case  else for  if repeat selectdo selectempty selecteos selecterror
1072 block.end.$(file.patterns.baan)=4 else endcase  endfor  endif endselect endwhile selectempty selecteos selecterror
1073 statement.lookback.$(file.patterns.baan)=0
1075 # Baan styles. Change colours based on preference.
1076 # Gray
1077 colour.baan.whitespace=fore:#808080
1078 #Olive
1079 colour.baan.preproc=fore:#808000
1080 #Magenta
1081 colour.baan.string=fore:#FF00FF
1082 #Teal
1083 colour.baan.comment.doc=fore:#008080
1084 #green
1085 colour.baan.comment.line=fore:#008000
1086 #Red
1087 colour.baan.numbers=fore:#FF0000
1088 #Maroon
1089 colour.baan.keyword=fore:#800000
1090 #Blue
1091 colour.baan.keyword2=fore:#0000FF
1092 colour.baan.keyword3=fore:#0000FF
1093 #Orange Red
1094 colour.baan.keyword4=fore:#FF4500 
1095 #Purple
1096 colour.baan.keyword5=fore:#800080
1097 colour.baan.keyword6=fore:#FF00FF,back:#4EE2EC
1098 colour.baan.keyword7=fore:#FF0000,back:#90EE90
1099 colour.baan.keyword8=fore:#CC00CC,back:#FFFF99
1100 colour.baan.keyword9=fore:#00FFFF
1101 #DarkOrchid
1102 colour.baan.tabledef=fore:#9932CC 
1103 #BlueViolet
1104 colour.baan.tablesql=fore:#8A2BE2
1105 #Navy
1106 colour.baan.functions=fore:#000080
1107 #DarkGoldenrod
1108 colour.baan.domaindef=fore:#B8860B
1109 # FireBrick
1110 colour.baan.funcdefs=fore:#B22222
1111 # OrangeRed
1112 colour.baan.objdefs=fore:#FF4500
1113 #Dark Olive Green
1114 colour.baan.definedefs=fore:#556B2F
1116 colour.baan.braces.highlight=fore:#0000FF
1117 colour.baan.braces.incomplete=fore:#FF0000
1118 colour.baan.eol.string.not.closed=fore:#000000,back:#E0C0E0
1119 colour.baan.operator=fore:#007F00       
1122 # Braces are only matched in operator style
1123 braces.baan.style=7
1125 #Indent properties
1126 statement.indent.$(file.patterns.baan)=12 after.choice: after.delete: after.display: after.field: after.form.read: after.form: \
1127 after.group: after.input: after.layout: after.program: after.receive.data: after.rewrite: after.skip.delete: after.skip.rewrite: \
1128 after.skip.write: after.update.db.commit: after.write: after.zoom: before.checks: before.choice: before.delete: before.display.object: \
1129 before.display: before.field: before.form: before.group: before.input: before.layout: before.new.object: before.print: before.program: \
1130 before.read: before.rewrite: before.write: before.zoom: check.input: declaration: domain.error: init.field: init.form: init.group: on.choice: \
1131 on.display.total.line: on.entry: on.error: on.exit: on.input: read.view: ref.display: ref.input: selection.filter: when.field.changes:
1133 #keywords Reserved Keywords (Do not Change)
1134 keywords.$(file.patterns.baan)=alike all and array as asc at avg base based between boolean both break bset buffer by call case cast chart clear \
1135 clearunref common const continue count cross current_date current_timestamp date date.num date.to.num debug default delete deleteempty \
1136 deleteerror desc dim distinct dll dllusage domain double else empty end endcase enddelete enddllusage endfor endfunctionusage endif endselect \
1137 endupdate endwhile enum_description eq escape exists extern false fatal fetching field first fixed for from full function functionusage ge global goto \
1138 group gt having hint hints if in include index inner input inrange integer is join label last le leading left like long lt max mb menu message min multibyte \
1139 ne no nodebug not notransactions nowarnings null on or order ordered outer path pi prepared print prompt question raw real ref reference refers repeat \
1140 retry return right row rows select selectbind selectdo selectempty selecteos selecterror session set setunref size skip static step sticky stop strict_boolean \
1141 string subhint sum table text_content then timestamp to trailing trim true union unref until update updateempty updateerror use used void warning warnings \
1142 when where wherebind whereused while with
1144 #Keywords2 Functions (Set your Functions based on Baan version & TIV level.)
1145 keywords2.$(file.patterns.baan)=abort abort.io  \
1146 db.after.delete db.after.insert db.after.update \
1147 xmlSetData \
1148 zoom.to$
1150 #Keywords3 Functions InListAbridged (Set Functions, based on Baan Version & TIV Level.) ~.is.mandatory will work for <any.field>.is.mandatory() DAL function.
1151 keywords3.$(file.patterns.baan)=~.is.mandatory 
1153 #Keywords4 Sub Sections (Sub Sections should always come before main sections, because after.~: in main section would overtake after.choice: and so on). (Do Not Change)
1154 keywords4.$(file.patterns.baan)=after.choice: after.delete: after.display: after.field: after.form: after.group: after.input: after.layout: after.read: after.rewrite: \
1155 after.skip.delete: after.skip.rewrite: after.skip.write: after.write: after.zoom: before.checks:  before.choice: before.delete: before.display: before.field: before.form: \
1156 before.group: before.input: before.layout: before.print: before.read: before.rewrite: before.write: before.zoom: check.input: domain.error: init.field: init.form: \
1157 init.group: on.choice: on.entry: on.exit: on.input: read.view: ref.display: ref.input: selection.filter: when.field.changes:
1159 #Keyword5 Main Sections InListAbridged (Do Not Change)
1160 keywords5.$(file.patterns.baan)=after.~: before.~: choice.abort.program: choice.abort.work: choice.add.set: choice.ask.helpinfo: choice.attachments: \
1161 choice.bms: choice.calculator: choice.calender: choice.cancel.work: choice.change.frm: choice.change.order: choice.cmd.about.baan: choice.cmd.copy: \
1162 choice.cmd.cut: choice.cmd.options: choice.cmd.paste: choice.cont.process: choice.create.job: choice.current.work: choice.cust.grid: choice.def.find: \
1163 choice.display.set: choice.dupl.occur: choice.end.program: choice.field.browse: choice.field.help: choice.find.data: choice.first.frm: choice.first.set: \
1164 choice.first.view: choice.freeze.columns: choice.get.defaults: choice.global.copy: choice.global.delete: choice.glossary: choice.help.index: choice.hide.fields: \
1165 choice.interrupt: choice.last.frm: choice.last.set: choice.last.view: choice.mark.delete: choice.mark.occur: choice.modify.set: choice.next.frm: choice.next.set: \
1166 choice.next.view: choice.next.work: choice.prev.frm: choice.prev.set: choice.prev.view: choice.print.data: choice.processes: choice.recover.set: choice.reference: \
1167 choice.resize.frm: choice.rotate.curr: choice.run.job: choice.save.defaults: choice.select.all: choice.send.data: choice.sendto.desktop: choice.sendto.editor: \
1168 choice.sendto.mail: choice.sendto.tasklst: choice.start.chart: choice.start.query: choice.start.set: choice.suspend.work: choice.switch.windows: choice.synchronize: \
1169 choice.text.manager: choice.to.clipboard: choice.unfreeze.colum: choice.update.db: choice.user.0: choice.user.1: choice.user.2: choice.user.3: choice.user.4: choice.user.5: \
1170 choice.user.6: choice.user.7: choice.user.8: choice.user.9: choice.using.help: choice.zoom:  declaration: detail.~: field.~: footer.~: form.~: functions: group.~: \
1171 header.~:  main.table.io: on.display.total.line: on.error: zoom.from.~:
1173 #Keyword6 PreDefined Variables (Set these predefined variables based on your Baan Version).
1174 keywords6.$(file.patterns.baan)=actual.occ \
1175 zoomreturn$
1177 #keywords7 Attributes PreDefined ( Below list needs to be typed in UPPER case in scripts, but keep it in lower here). (Set these predefined Attributes based on your Baan Version).
1178 keywords7.$(file.patterns.baan)=__file__ \
1179 z.session
1181 #keywords8 Enumerate domains. Enter domain domain names starting with '^' and ending with '.'. All the enumerates would be listed. (Based on your Baan Version).
1182 keywords8.$(file.patterns.baan)=^tcyesno. ^tdsls.corg.
1184 #Keywords9 MACROS from standard based on your Baan Version. Write in CAPS inside the scripts, but in lower here.
1185 keywords9.$(file.patterns.baan)=dalnew dalupdate
1190 ###############################################################################
1191 # From blitzbasic.properties
1192 # Define SciTE settings for BlitzBasic files.
1194 file.patterns.blitzbasic=*.bb
1196 filter.blitzbasic=BlitzBasic (bb)|$(file.patterns.blitzbasic)|
1198 *filter.blitzbasic=$(filter.blitzbasic)
1200 lexer.$(file.patterns.blitzbasic)=blitzbasic
1202 # keywords must be all lowercase
1204 keywordclass.blitzbasic=abs accepttcpstream acos after and apptitle asc asin atan atan2 \
1205 automidhandle autosuspend availvidmem backbuffer banksize before bin calldll \
1206 case ceil changedir channelpan channelpitch channelplaying channelvolume chr \
1207 closedir closefile closemovie closetcpserver closetcpstream closeudpstream cls \
1208 clscolor color colorblue colorgreen colorred commandline const copybank copyfile \
1209 copyimage copypixel copypixelfast copyrect copystream cos countgfxdrivers \
1210 countgfxmodes counthostips createbank createdir createimage createnetplayer \
1211 createprocess createtcpserver createtimer createudpstream currentdate currentdir \
1212 currenttime data debuglog default delay delete deletedir deletefile \
1213 deletenetplayer desktopbuffer dim dottedip drawblock drawblockrect drawimage \
1214 drawimagerect drawmovie each else else if elseif end end function end if end \
1215 select end type endgraphics endif eof execfile exit exp false field filepos \
1216 filesize filetype first flip float floor flushjoy flushkeys flushmouse \
1217 fontheight fontname fontsize fontstyle fontwidth for forever freebank freefont \
1218 freeimage freesound freetimer frontbuffer function gammablue gammagreen gammared \
1219 getcolor getenv getkey getmouse gfxdrivername gfxmodedepth gfxmodeexists \
1220 gfxmodeformat gfxmodeheight gfxmodewidth global gosub goto grabimage graphics \
1221 graphicsbuffer graphicsdepth graphicsformat graphicsheight graphicswidth \
1222 handleimage hex hidepointer hostip hostnetgame if imagebuffer imageheight \
1223 imagerectcollide imagerectoverlap imagescollide imagesoverlap imagewidth \
1224 imagexhandle imageyhandle include input insert instr int joinnetgame joydown \
1225 joyhat joyhit joypitch joyroll joytype joyu joyudir joyv joyvdir joyx joyxdir \
1226 joyy joyyaw joyydir joyz joyzdir keydown keyhit keywait last left len line \
1227 loadanimimage loadbuffer loadfont loadimage loadsound local lockbuffer \
1228 lockedformat lockedpitch lockedpixels log log10 loopsound lower lset maskimage \
1229 mid midhandle millisecs mod morefiles mousedown mousehit mousex mousexspeed \
1230 mousey mouseyspeed mousez mousezspeed movemouse movieheight movieplaying \
1231 moviewidth netmsgdata netmsgfrom netmsgto netmsgtype netplayerlocal \
1232 netplayername new next nextfile not null openfile openmovie opentcpstream or \
1233 origin oval pausechannel pausetimer peekbyte peekfloat peekint peekshort pi \
1234 playcdtrack playmusic playsound plot pokebyte pokefloat pokeint pokeshort print \
1235 queryobject rand read readavail readbyte readbytes readdir readfile readfloat \
1236 readint readline readpixel readpixelfast readshort readstring rect rectsoverlap \
1237 recvnetmsg recvudpmsg repeat replace resettimer resizebank resizeimage restore \
1238 resumechannel resumetimer return right rnd rndseed rotateimage rset runtimeerror \
1239 sar savebuffer saveimage scaleimage scanline seedrnd seekfile select sendnetmsg \
1240 sendudpmsg setbuffer setenv setfont setgamma setgfxdriver sgn shl showpointer \
1241 shr sin soundpan soundpitch soundvolume sqr startnetgame step stop stopchannel \
1242 stopnetgame str string stringheight stringwidth systemproperty tan tcpstreamip \
1243 tcpstreamport tcptimeouts text tformfilter tformimage then tileblock tileimage \
1244 timerticks to totalvidmem trim true type udpmsgip udpmsgport udpstreamip \
1245 udpstreamport udptimeouts unlockbuffer until updategamma upper viewport vwait \
1246 waitkey waitmouse waittimer wend while write writebyte writebytes writefile \
1247 writefloat writeint writeline writepixel writepixelfast writeshort writestring \
1250 keywords.$(file.patterns.blitzbasic)=$(keywordclass.blitzbasic)
1252 # BB styles
1253 # Preprocessor
1254 # Date
1255 # StringEOL
1256 # Constant
1257 # Asm
1262 ###############################################################################
1263 # From bullant.properties
1264 # Define SciTE settings for Bullant files.
1266 filter.bullant=Bullant (.ant)|*.ant|
1268 *filter.bullant=$(filter.bullant)
1270 file.patterns.bullant=*.ant
1272 lexer.$(file.patterns.bullant)=bullant
1274 *language.bullant=Bullant|ant||
1276 keywordclass.bullant=abstract all ancestor and application \
1277 assert attributes author \
1278 begin \
1279 callback class concrete config constants construct continue \
1280 depends description downcast driver \
1281 elif else ensures error exception exposure extension \
1282 false fatal final function \
1283 generics glyph \
1284 help hidden host \
1285 immutable in inherits is \
1286 kernel \
1287 label leave library locals \
1288 mutable \
1289 none not null \
1290 obsolete options or other \
1291 parameters peer private public \
1292 raise reason restricted retry return \
1293 returns rollback route \
1294 security self settings severity step \
1295 task test transaction true \
1296 unknown \
1297 varying \
1298 warning when \
1299 method end if until while trap case debug for foreach lock \
1300 boolean \
1301 character character$ \
1302 date date$ datetime datetime$ \
1303 float \
1304 hex$ \
1305 identifier identifier$ integer interval interval$ \
1306 money money$ \
1307 raw raw$ \
1308 string \
1309 tick tick$ time time$ \
1310 version version$
1313 keywords.$(file.patterns.bullant)=$(keywordclass.bullant)
1315 # Bullant styles
1319 # compile
1320 command.compile.*.ant=
1322 # normal execute
1323 command.go.*.ant=
1324 command.go.subsystem.*.ant=
1326 #build=compile ...
1327 command.build.*.ant=
1328 command.build.subsystem.*.ant=
1333 ###############################################################################
1334 # From caml.properties
1335 #       Define SciTE settings for Objective Caml, Standard ML 97 files
1337 #       To use with Standard ML source in .ml files, select Standard ML
1338 #       from the SciTE Language menu (or adjust the properties below).
1340 # To fully enable this Scintilla lexer, make sure the following entries
1341 #       are present and uncommented in your SciTE properties:
1343 #               $(filter.caml)\
1344 #               $(filter.sml)\
1346 #               Objective Caml|ml||\
1347 #               Standard ML|sml||\
1349 #               import caml
1351 # OCaml/SML implementation and interface files
1352 file.patterns.caml=*.ml;*.mli
1353 file.patterns.sml=*.sml
1355 *filter.objectivecaml=$(filter.caml)
1357 filter.caml=Objective Caml (ml mli)|$(file.patterns.caml)|
1358 filter.sml=Standard ML 97 (sml ml)|$(file.patterns.sml)|
1360 lexer.*.caml=caml
1361 lexer.$(file.patterns.caml)=caml
1362 lexer.$(file.patterns.sml)=caml
1364 #*language.objectivecaml=Objective Caml|ml||
1366 # the line below is ONLY used as part of "external" lexer support
1367 #lexerpath.$(file.patterns.caml)=LexCaml.dll
1368 #lexerpath.$(file.patterns.sml)=LexCaml.dll
1370 # the standard Objective Caml 3.09/3.10/3.11 language "textual" keywords
1371 keywordstandard.caml= \
1372 and as assert asr begin class \
1373 constraint do done downto else end \
1374 exception external false for fun function \
1375 functor if in include inherit initializer \
1376 land lazy let lor lsl lsr \
1377 lxor match method mod module mutable \
1378 new object of open or private \
1379 rec sig struct then to true \
1380 try type val virtual when while \
1381 with
1382 keywords.$(file.patterns.caml)=$(keywordstandard.caml)
1384 # the standard Standard ML '97 language "textual" keywords
1385 keywordstandard.sml= \
1386 abstype andalso and as case datatype div do \
1387 else end eqtype exception \
1388 false fn fun functor handle if infixr infix include in let local \
1389 mod nonfix not of open op orelse raise rec \
1390 sharing signature sig structure struct then true type use \
1391 val while withtype with
1392 keywords.$(file.patterns.sml)=$(keywordstandard.sml)
1394 # "optional" Objective Caml / library keywords; some suggested entries are here,
1395 # more could come from, say, Pervasives ('parser' is from Camlp4)
1396 keywordoptional1.caml= \
1397 option Some None ignore ref lnot succ pred parser
1398 keywords2.$(file.patterns.caml)=$(keywordoptional1.caml)
1400 # "optional" Standard ML '97 / library keywords; some suggested entries are here,
1401 # more could come from, say, Standard Basis Library
1402 keywordoptional1.sml= \
1403 option SOME NONE ignore ref \
1404 chr explode implode ord size
1405 keywords2.$(file.patterns.sml)=$(keywordoptional1.sml)
1407 # "optional" Objective Caml / library keywords; some suggested entries are here,
1408 # more could come from, say, user-defined types
1409 keywordoptional2.caml= \
1410 array bool char float int list string unit
1411 keywords3.$(file.patterns.caml)=$(keywordoptional2.caml)
1413 # "optional" Standard ML '97 / library keywords; some suggested entries are here,
1414 # more could come from, say, user-defined types
1415 keywordoptional2.sml= \
1416 array bool char int list nil real string unit vector word
1417 keywords3.$(file.patterns.sml)=$(keywordoptional2.sml)
1419 word.characters.$(file.patterns.caml)=$(chars.alpha)$(chars.numeric)_'`
1420 word.characters.$(file.patterns.sml)=$(chars.alpha)$(chars.numeric)_'
1422 comment.stream.start.caml=(*
1423 comment.stream.end.caml=*)
1424 comment.box.start.caml=(*
1425 comment.box.middle.caml= *
1426 comment.box.end.caml= *)
1428 # "folding" support not currently implemented
1430 # "Out-of-the-box" syntax colors are defined here - I like having
1431 # my literals (number, char, and string), tag-names, and "optional"
1432 # keywords stand out - you might not, so adjust accordingly!
1433 # Tag-names
1434 # Keywords2 (season to taste - use for option, Some, None, etc)
1435 # Keywords3 (season to taste - use for bool, char, float, etc)
1436 # Embedded whitespace (SML character/string constant)
1438 # Braces are only matched in operator style
1439 braces.caml.style=7
1441 # The below command(s) can and should be adjusted to reflect your environment;
1442 # in addition, per-directory overrides are possible, so that project-specific "build"
1443 # commands may be used for more complex cases - see the SciTE documentation.
1444 command.compile.$(file.patterns.caml)=ocamlc -c $(FileNameExt)
1448 ###############################################################################
1449 # From cmake.properties
1450 # Define SciTE settings for CMake.
1451 # contributed by Cristian Adam <cristian dot adam at gmx dot net>
1453 filter.cmake=CMake (CMakeLists.txt cmake ctest)|CMakeLists.txt;*.cmake;*.cmake.in;*.ctest;*.ctest.in|
1454 *filter.cmake=$(filter.cmake)
1455 file.patterns.cmake=CMakeLists.txt;*.cmake;*.cmake.in;*.ctest;*.ctest.in
1456 lexer.$(file.patterns.cmake)=cmake
1457 *language.cmake=CMake|cmake||
1459 # Commands:
1460 keywords.$(file.patterns.cmake)= add_custom_command \
1461 add_custom_target \
1462 add_definitions \
1463 add_dependencies \
1464 add_executable \
1465 add_library \
1466 add_subdirectory \
1467 add_test \
1468 aux_source_directory \
1469 build_command \
1470 build_name \
1471 cmake_minimum_required \
1472 configure_file \
1473 create_test_sourcelist \
1474 else \
1475 elseif \
1476 enable_language \
1477 enable_testing \
1478 endforeach \
1479 endif \
1480 endmacro \
1481 endwhile \
1482 exec_program \
1483 execute_process \
1484 export_library_dependencies \
1485 file \
1486 find_file \
1487 find_library \
1488 find_package \
1489 find_path \
1490 find_program \
1491 fltk_wrap_ui \
1492 foreach \
1493 get_cmake_property \
1494 get_directory_property \
1495 get_filename_component \
1496 get_source_file_property \
1497 get_target_property \
1498 get_test_property \
1499 if \
1500 include \
1501 include_directories \
1502 include_external_msproject \
1503 include_regular_expression \
1504 install \
1505 install_files \
1506 install_programs \
1507 install_targets \
1508 link_directories \
1509 link_libraries \
1510 list \
1511 load_cache \
1512 load_command \
1513 macro \
1514 make_directory \
1515 mark_as_advanced \
1516 math \
1517 message \
1518 option \
1519 output_required_files \
1520 project \
1521 qt_wrap_cpp \
1522 qt_wrap_ui \
1523 remove \
1524 remove_definitions \
1525 separate_arguments \
1526 set \
1527 set_directory_properties \
1528 set_source_files_properties \
1529 set_target_properties \
1530 set_tests_properties \
1531 site_name \
1532 source_group \
1533 string \
1534 subdir_depends \
1535 subdirs \
1536 target_link_libraries \
1537 try_compile \
1538 try_run \
1539 use_mangled_mesa \
1540 utility_source \
1541 variable_requires \
1542 vtk_make_instantiator \
1543 vtk_wrap_java \
1544 vtk_wrap_python \
1545 vtk_wrap_tcl \
1546 while \
1547 write_file
1549 # Variables:
1550 keywords2.$(file.patterns.cmake)= ABSOLUTE \
1551 ABSTRACT \
1552 ADDITIONAL_MAKE_CLEAN_FILES \
1553 ALL \
1554 AND \
1555 APPEND \
1556 ARGS \
1557 ASCII \
1558 BEFORE \
1559 CACHE \
1560 CACHE_VARIABLES \
1561 CLEAR \
1562 COMMAND \
1563 COMMANDS \
1564 COMMAND_NAME \
1565 COMMENT \
1566 COMPARE \
1567 COMPILE_FLAGS \
1568 COPYONLY \
1569 DEFINED \
1570 DEFINE_SYMBOL \
1571 DEPENDS \
1572 DOC \
1573 EQUAL \
1574 ESCAPE_QUOTES \
1575 EXCLUDE \
1576 EXCLUDE_FROM_ALL \
1577 EXISTS \
1578 EXPORT_MACRO \
1579 EXT \
1580 EXTRA_INCLUDE \
1581 FATAL_ERROR \
1582 FILE \
1583 FILES \
1584 FORCE \
1585 FUNCTION \
1586 GENERATED \
1587 GLOB \
1588 GLOB_RECURSE \
1589 GREATER \
1590 GROUP_SIZE \
1591 HEADER_FILE_ONLY \
1592 HEADER_LOCATION \
1593 IMMEDIATE \
1594 INCLUDES \
1595 INCLUDE_DIRECTORIES \
1596 INCLUDE_INTERNALS \
1597 INCLUDE_REGULAR_EXPRESSION \
1598 LESS \
1599 LINK_DIRECTORIES \
1600 LINK_FLAGS \
1601 LOCATION \
1602 MACOSX_BUNDLE \
1603 MACROS \
1604 MAIN_DEPENDENCY \
1605 MAKE_DIRECTORY \
1606 MATCH \
1607 MATCHALL \
1608 MATCHES \
1609 MODULE \
1610 NAME \
1611 NAME_WE \
1612 NOT \
1613 NOTEQUAL \
1614 NO_SYSTEM_PATH \
1615 OBJECT_DEPENDS \
1616 OPTIONAL \
1617 OR \
1618 OUTPUT \
1619 OUTPUT_VARIABLE \
1620 PATH \
1621 PATHS \
1622 POST_BUILD \
1623 POST_INSTALL_SCRIPT \
1624 PREFIX \
1625 PREORDER \
1626 PRE_BUILD \
1627 PRE_INSTALL_SCRIPT \
1628 PRE_LINK \
1629 PROGRAM \
1630 PROGRAM_ARGS \
1631 PROPERTIES \
1632 QUIET \
1633 RANGE \
1634 READ \
1635 REGEX \
1636 REGULAR_EXPRESSION \
1637 REPLACE \
1638 REQUIRED \
1639 RETURN_VALUE \
1640 RUNTIME_DIRECTORY \
1641 SEND_ERROR \
1642 SHARED \
1643 SOURCES \
1644 STATIC \
1645 STATUS \
1646 STREQUAL \
1647 STRGREATER \
1648 STRLESS \
1649 SUFFIX \
1650 TARGET \
1651 TOLOWER \
1652 TOUPPER \
1653 VAR \
1654 VARIABLES \
1655 VERSION \
1656 WIN32 \
1657 WRAP_EXCLUDE \
1658 WRITE \
1659 APPLE  \
1660 MINGW \
1661 MSYS \
1662 CYGWIN  \
1663 BORLAND \
1664 WATCOM \
1665 MSVC MSVC_IDE MSVC60 MSVC70 MSVC71 MSVC80 CMAKE_COMPILER_2005 \
1666 OFF ON \
1668 #User defined:
1669 #keywords3.$(file.patterns.cmake)=MyFunction MySomethingElse
1671 # Block and indenting
1672 statement.indent.$(file.patterns.cmake)=5 if while foreach macro
1673 comment.block.cmake=#~
1674 comment.block.at.line.start.cmake=1
1675 calltip.cmake.ignorecase=1
1676 calltip.cmake.parameters.start=(
1677 calltip.cmake.parameters.separators=,
1678 calltip.cmake.parameters.end=)
1683 ###############################################################################
1684 # From cobol.properties
1685 # Define SciTE settings for COBOL files.
1687 file.patterns.COBOL=*.cob;*.cbl;*.cpy
1688 filter.cobol=COBOL (cob cbl cpy)|$(file.patterns.COBOL)|
1689 *filter.cobol=$(filter.cobol)
1691 lexer.$(file.patterns.COBOL)=COBOL
1693 *language.cobol=COBOL|cob||
1695 word.characters.$(file.patterns.COBOL)=$(chars.alpha)$(chars.numeric)$(chars.accented)_-
1697 # These keywords are case insensitive
1698 keywords.$(file.patterns.COBOL)=configuration data declaratives division environment environment-division file file-control function i-o i-o-control identification input input-output linkage local-storage output procedure program program-id receive-control section special-names working-storage
1699 keywords2.$(file.patterns.COBOL)=accept add alter apply assign call chain close compute continue control convert copy count delete display divide draw drop eject else enable end-accept end-add end-call end-chain end-compute end-delete end-display end-divide end-evaluate end-if end-invoke end-multiply end-perform end-read end-receive end-return end-rewrite end-search end-start end-string end-subtract end-unstring end-write erase evaluate examine exec execute exit go goback generate if ignore initialize initiate insert inspect invoke leave merge move multiply open otherwise perform print read receive release reload replace report reread rerun reserve reset return rewind rewrite rollback run search seek select send set sort start stop store string subtract sum suppress terminate then transform unlock unstring update use wait when wrap write
1700 keywords3.$(file.patterns.COBOL)=access acquire actual address advancing after all allowing alphabet alphabetic alphabetic-lower alphabetic-upper alphanumeric alphanumeric-edited also alternate and any are area areas as ascending at attribute author auto auto-hyphen-skip auto-skip automatic autoterminate background-color background-colour backward basis beep before beginning bell binary blank blink blinking block bold bottom box boxed by c01 c02 c03 c04 c05 c06 c07 c08 c09 c10 c11 c12 cancel cbl cd centered cf ch chaining changed character characters chart class clock-units cobol code code-set col collating color colour column com-reg comma command-line commit commitment common communication comp comp-0 comp-1 comp-2 comp-3 comp-4 comp-5 comp-6 comp-x compression computational computational-1 computational-2 computational-3 computational-4 computational-5 computational-6 computational-x computational console contains content control-area controls conversion converting core-index corr corresponding crt crt-under csp currency current-date cursor cycle cyl-index cyl-overflow date date-compiled date-written day day-of-week dbcs de debug debug-contents debug-item debug-line debug-name debug-sub-1 debug-sub-2 debug-sub-3 debugging decimal-point default delimited delimiter depending descending destination detail disable disk disp display-1 display-st down duplicates dynamic echo egcs egi emi empty-check encryption end end-of-page ending enter entry eol eop eos equal equals error escape esi every exceeds exception excess-3 exclusive exhibit extend extended-search external externally-described-key factory false fd fh--fcd fh--keydef file-id file-limit file-limits file-prefix filler final first fixed footing for foreground-color foreground-colour footing format from full giving global greater grid group heading high high-value high-values highlight id in index indexed indic indicate indicator indicators inheriting initial installation into invalid invoked is japanese just justified kanji kept key keyboard label last leading left left-justify leftline length length-check less limit limits lin linage linage-counter line line-counter lines lock lock-holding locking low low-value low-values lower lowlight manual mass-update master-index memory message method mode modified modules more-labels multiple name named national national-edited native nchar negative next no no-echo nominal not note nstd-reels null nulls number numeric numeric-edited numeric-fill o-fill object object-computer object-storage occurs of off omitted on oostackptr optional or order organization other others overflow overline packed-decimal padding page page-counter packed-decimal paragraph password pf ph pic picture plus pointer pop-up pos position positioning positive previous print-control print-switch printer printer-1 printing prior private procedure-pointer procedures proceed process processing prompt protected public purge queue quote quotes random range rd readers ready record record-overflow recording records redefines reel reference references relative remainder remarks removal renames reorg-criteria repeated replacing reporting reports required resident return-code returning reverse reverse-video reversed rf rh right right-justify rolling rounded s01 s02 s03 s04 s05 same screen scroll sd secure security segment segment-limit selective self selfclass sentence separate sequence sequential service setshadow shift-in shift-out sign size skip1 skip2 skip3 sort-control sort-core-size sort-file-size sort-merge sort-message sort-mode-size sort-option sort-return source source-computer space spaces space-fill spaces standard standard-1 standard-2 starting status sub-queue-1 sub-queue-2 sub-queue-3 subfile super symbolic sync synchronized sysin sysipt syslst sysout syspch syspunch system-info tab tallying tape terminal terminal-info test text than through thru time time-of-day time-out timeout times title to top totaled totaling trace track-area track-limit tracks trailing trailing-sign transaction true type typedef underline underlined unequal unit until up updaters upon upper upsi-0 upsi-1 upsi-2 upsi-3 upsi-4 upsi-5 upsi-6 upsi-7 usage user using value values variable varying when-compiled window with words write-only write-verify writerszero zero zero-fill zeros zeroes
1702 # COBOL styles
1703 # 2,Line Comment|3,Doc Comment|4,Number|5,Keyword (A)|6,String|7,Character|8,Extended keyword|9,Preprocessor|10,Operator
1704 # 11,Identifier|16,Keyword (B)
1713 ###############################################################################
1714 # From coffeescript.properties
1715 # Define SciTE settings for CoffeeScript files.
1717 filter.coffeescript=CoffeeScript (coffee)|*.coffee|
1719 file.patterns.coffeescript=*.coffee
1721 lexer.$(file.patterns.coffeescript)=coffeescript
1726 ###############################################################################
1727 # From conf.properties
1728 # Define SciTE settings for Apache Configuration files.
1729 # contributed by Ahmad Zawawi <zeus_go64@hotmail.com>
1731 file.patterns.conf=*.conf;.htaccess
1732 *source.patterns.conf=$(file.patterns.conf);
1733 filter.conf=Apache Conf (conf)|$(file.patterns.conf)|
1734 *filter.apacheconfig=$(filter.conf)
1735 lexer.$(file.patterns.conf)=conf
1736 #*language.apacheconfig=Apache Confi&g|conf||
1737 # for future implemention...
1738 #api.$(file.patterns.conf)=conf.api
1740 # Keywords for Apache's Runtime directives
1741 keywords.$(file.patterns.conf)=\
1742 acceptmutex acceptpathinfo accessconfig accessfilename \
1743 action addalt addaltbyencoding addaltbytype addcharset \
1744 adddefaultcharset adddescription addencoding \
1745 addhandler addicon addiconbyencoding addiconbytype \
1746 addinputfilter addlanguage addmodule addmoduleinfo \
1747 addoutputfilter addoutputfilterbytype addtype agentlog \
1748 alias aliasmatch all allow allowconnect \
1749 allowencodedslashes allowoverride anonymous \
1750 anonymous_authoritative anonymous_logemail \
1751 anonymous_mustgiveemail anonymous_nouserid \
1752 anonymous_verifyemail assignuserid authauthoritative \
1753 authdbauthoritative authdbgroupfile \
1754 authdbmauthoritative authdbmgroupfile authdbmtype \
1755 authdbmuserfile authdbuserfile authdigestalgorithm \
1756 authdigestdomain authdigestfile authdigestgroupfile \
1757 authdigestnccheck authdigestnonceformat \
1758 authdigestnoncelifetime authdigestqop \
1759 authdigestshmemsize authgroupfile \
1760 authldapauthoritative authldapbinddn \
1761 authldapbindpassword authldapcharsetconfig \
1762 authldapcomparednonserver authldapdereferencealiases \
1763 authldapenabled authldapfrontpagehack \
1764 authldapgroupattribute authldapgroupattributeisdn \
1765 authldapremoteuserisdn authldapurl authname authtype \
1766 authuserfile bindaddress browsermatch \
1767 browsermatchnocase bs2000account bufferedlogs \
1768 cachedefaultexpire cachedirlength cachedirlevels \
1769 cachedisable cacheenable cacheexpirycheck cachefile \
1770 cacheforcecompletion cachegcclean cachegcdaily \
1771 cachegcinterval cachegcmemusage cachegcunused \
1772 cacheignorecachecontrol cacheignoreheaders \
1773 cacheignorenolastmod cachelastmodifiedfactor \
1774 cachemaxexpire cachemaxfilesize cacheminfilesize \
1775 cachenegotiateddocs cacheroot cachesize \
1776 cachetimemargin cgimapextension charsetdefault \
1777 charsetoptions charsetsourceenc checkspelling \
1778 childperuserid clearmodulelist contentdigest \
1779 cookiedomain cookieexpires cookielog cookiename \
1780 cookiestyle cookietracking coredumpdirectory customlog \
1781 dav davdepthinfinity davlockdb davmintimeout \
1782 defaulticon defaultlanguage defaulttype define \
1783 deflatebuffersize deflatecompressionlevel \
1784 deflatefilternote deflatememlevel deflatewindowsize \
1785 deny directory directoryindex directorymatch \
1786 directoryslash documentroot dumpioinput dumpiooutput \
1787 enableexceptionhook enablemmap enablesendfile \
1788 errordocument errorlog example expiresactive \
1789 expiresbytype expiresdefault extendedstatus \
1790 extfilterdefine extfilteroptions fancyindexing \
1791 fileetag files filesmatch forcelanguagepriority \
1792 forcetype forensiclog from group header headername \
1793 hostnamelookups identitycheck ifdefine ifmodule \
1794 imapbase imapdefault imapmenu include indexignore \
1795 indexoptions indexorderdefault isapiappendlogtoerrors \
1796 isapiappendlogtoquery isapicachefile isapifakeasync \
1797 isapilognotsupported isapireadaheadbuffer keepalive \
1798 keepalivetimeout languagepriority ldapcacheentries \
1799 ldapcachettl ldapconnectiontimeout ldapopcacheentries \
1800 ldapopcachettl ldapsharedcachefile ldapsharedcachesize \
1801 ldaptrustedca ldaptrustedcatype limit limitexcept \
1802 limitinternalrecursion limitrequestbody \
1803 limitrequestfields limitrequestfieldsize \
1804 limitrequestline limitxmlrequestbody listen \
1805 listenbacklog loadfile loadmodule location \
1806 locationmatch lockfile logformat loglevel maxclients \
1807 maxkeepaliverequests maxmemfree maxrequestsperchild \
1808 maxrequestsperthread maxspareservers maxsparethreads \
1809 maxthreads maxthreadsperchild mcachemaxobjectcount \
1810 mcachemaxobjectsize mcachemaxstreamingbuffer \
1811 mcacheminobjectsize mcacheremovalalgorithm mcachesize \
1812 metadir metafiles metasuffix mimemagicfile \
1813 minspareservers minsparethreads mmapfile \
1814 modmimeusepathinfo multiviewsmatch namevirtualhost \
1815 nocache noproxy numservers nwssltrustedcerts \
1816 nwsslupgradeable options order passenv pidfile port \
1817 protocolecho proxy proxybadheader proxyblock \
1818 proxydomain proxyerroroverride proxyiobuffersize \
1819 proxymatch proxymaxforwards proxypass proxypassreverse \
1820 proxypreservehost proxyreceivebuffersize proxyremote \
1821 proxyremotematch proxyrequests proxytimeout proxyvia \
1822 qsc readmename redirect redirectmatch \
1823 redirectpermanent redirecttemp refererignore \
1824 refererlog removecharset removeencoding removehandler \
1825 removeinputfilter removelanguage removeoutputfilter \
1826 removetype requestheader require resourceconfig \
1827 rewritebase rewritecond rewriteengine rewritelock \
1828 rewritelog rewriteloglevel rewritemap rewriteoptions \
1829 rewriterule rlimitcpu rlimitmem rlimitnproc satisfy \
1830 scoreboardfile script scriptalias scriptaliasmatch \
1831 scriptinterpretersource scriptlog scriptlogbuffer \
1832 scriptloglength scriptsock securelisten sendbuffersize \
1833 serveradmin serveralias serverlimit servername \
1834 serverpath serverroot serversignature servertokens \
1835 servertype setenv setenvif setenvifnocase sethandler \
1836 setinputfilter setoutputfilter singlelisten ssiendtag \
1837 ssierrormsg ssistarttag ssitimeformat ssiundefinedecho \
1838 sslcacertificatefile sslcacertificatepath \
1839 sslcarevocationfile sslcarevocationpath \
1840 sslcertificatechainfile sslcertificatefile \
1841 sslcertificatekeyfile sslciphersuite sslengine \
1842 sslmutex ssloptions sslpassphrasedialog sslprotocol \
1843 sslproxycacertificatefile sslproxycacertificatepath \
1844 sslproxycarevocationfile sslproxycarevocationpath \
1845 sslproxyciphersuite sslproxyengine \
1846 sslproxymachinecertificatefile \
1847 sslproxymachinecertificatepath sslproxyprotocol \
1848 sslproxyverify sslproxyverifydepth sslrandomseed \
1849 sslrequire sslrequiressl sslsessioncache \
1850 sslsessioncachetimeout sslusername sslverifyclient \
1851 sslverifydepth startservers startthreads \
1852 suexecusergroup threadlimit threadsperchild \
1853 threadstacksize timeout transferlog typesconfig \
1854 unsetenv usecanonicalname user userdir \
1855 virtualdocumentroot virtualdocumentrootip virtualhost \
1856 virtualscriptalias virtualscriptaliasip \
1857 win32disableacceptex xbithack
1859 #common parameters for Apache runtime configuration
1860 keywords2.$(file.patterns.conf)=\
1861 on off standalone inetd \
1862 force-response-1.0 downgrade-1.0 nokeepalive \
1863 indexes includes followsymlinks none \
1864 x-compress x-gzip
1867 # compiling/building simply checks for the correct symantics....
1868 command.compile.$(file.patterns.conf)=httpd -t -f $(FilePath)
1869 command.build.$(file.patterns.conf)=httpd -t -f $(FilePath)
1873 ###############################################################################
1874 # From cpp.properties
1875 # Define SciTE settings for C++, C, C#, Ch, Java, IDL, JavaScript, Flash (ActionScript 2) files.
1877 # sma files are Small script (C-like)
1878 file.patterns.cpp=*.c;*.cc;*.cpp;*.cxx;*.h;*.hh;*.hpp;*.hxx;*.ipp;*.m;*.mm;*.sma
1879 file.patterns.cplusplus=*.cc;*.cpp;*.cxx
1880 # jad = decompiled class files; pde = Processing.org sketch files
1881 file.patterns.java=*.java;*.jad;*.pde
1882 # pln, inc and t are SilkTest (4Test) files.
1883 file.patterns.test=*.pln;*.inc;*.t
1884 # es = JS dialect of Abobe for SVG
1885 file.patterns.js=*.js;*.es;*.ts
1886 file.patterns.cs=*.cs
1887 file.patterns.rc=*.rc;*.rc2;*.dlg
1888 file.patterns.idl=*.idl;*.odl
1889 file.patterns.flash=*.as;*.asc;*.jsfl
1890 file.patterns.ch=*.ch;*.chf;*.chs
1891 file.patterns.vala=*.vala
1892 file.patterns.go=*.go
1893 file.patterns.pike=*.pike
1894 file.patterns.swift=*.swift
1895 file.patterns.c.like=$(file.patterns.cpp);$(file.patterns.cs);$(file.patterns.idl);$(file.patterns.java);$(file.patterns.js);$(file.patterns.flash);$(file.patterns.ch);$(file.patterns.vala);$(file.patterns.pike)
1897 *source.patterns.cpp=$(file.patterns.c.like);
1898 *source.patterns.resource=$(file.patterns.rc);*.def;
1900 shbang.tcc=cpp
1901 shbang.tinycc=cpp
1903 filter.cpp=C/C++ (c cc cpp cxx cs vala h hh hxx hpp ipp dlg rc rc2 mak)|\
1904 $(file.patterns.cpp);$(file.patterns.cs);$(file.patterns.rc);$(file.patterns.vala);*.mak;make*|
1905 filter.java=Java (java)|*.java|
1906 filter.js=JavaScript (js es ts)|$(file.patterns.js)|
1907 filter.idl=IDL (idl odl)|$(file.patterns.idl)|
1908 filter.test=SilkTest (pln inc t)|$(file.patterns.test)|
1909 filter.flash=Flash (as asc jsfl)|$(file.patterns.flash)|
1910 filter.ch=Ch (ch chf chs)|$(file.patterns.ch)|
1911 filter.go=Go (go)|$(file.patterns.go)|
1912 filter.pike=Pike (pike)|$(file.patterns.pike)|
1913 filter.swift=Swift (swift)|$(file.patterns.swift)|
1915 *filter.cpp=$(filter.cpp)
1916 *filter.java=$(filter.java)
1917 *filter.javascript=$(filter.js)
1918 *filter.idl=$(filter.idl)
1920 lexer.$(file.patterns.java)=cpp
1921 lexer.$(file.patterns.cpp)=cpp
1922 lexer.$(file.patterns.rc)=cpp
1923 lexer.$(file.patterns.idl)=cpp
1924 lexer.$(file.patterns.cs)=cpp
1925 lexer.$(file.patterns.js)=cpp
1926 lexer.$(file.patterns.test)=cpp
1927 lexer.$(file.patterns.flash)=cpp
1928 lexer.$(file.patterns.ch)=cpp
1929 lexer.$(file.patterns.vala)=cpp
1930 lexer.$(file.patterns.go)=cpp
1931 lexer.$(file.patterns.pike)=cpp
1932 lexer.$(file.patterns.swift)=cpp
1934 *language.c=&C / C++|c||
1935 *language.csharp=C&#|cs||
1936 *language.java=&Java|java||
1937 *language.javascript=Java&Script|js||
1938 #*language.resource=Reso&urce|rc||
1940 keywordclass.cpp=alignas alignof and and_eq asm auto bitand bitor bool break \
1941 case catch char char16_t char32_t class compl const constexpr const_cast continue \
1942 decltype default delete do double dynamic_cast else enum explicit export extern false final float for \
1943 friend goto if inline int long mutable namespace new noexcept not not_eq nullptr \
1944 operator or or_eq override private protected public \
1945 register reinterpret_cast return short signed sizeof static static_assert static_cast struct switch \
1946 template this thread_local throw true try typedef typeid typename union unsigned using \
1947 virtual void volatile wchar_t while xor xor_eq
1949 directives.objective.c=\
1950 @class @defs @protocol @required @optional @end \
1951 @interface @public @package @protected @private @property \
1952 @implementation @synthesize @dynamic \
1953 @throw @try @catch @finally \
1954 @synchronized @autoreleasepool \
1955 @selector @encode \
1956 @compatibility_alias
1958 # Since Objective C and C++ share the .h extension, allow Objective C directives as keywords
1959 # For stricter display of pure C++, specify keywords.$(file.patterns.cpp)=$(keywordclass.cpp)
1960 keywords.$(file.patterns.cpp)=$(keywordclass.cpp) $(directives.objective.c)
1962 # keywords2 is for highlighting user defined keywords or function calls or similar
1963 #keywords2.$(file.patterns.cpp)=file
1965 # keywords3 is for doc comment keywords, highlighted in style 17
1966 #CPP doxygen
1967 file.patterns.doxygen.langs=$(file.patterns.cpp);$(file.patterns.java)
1968 keywordclass.doxygen=a addindex addtogroup anchor arg attention \
1969 author b brief bug c class code date def defgroup deprecated dontinclude \
1970 e em endcode endhtmlonly endif endlatexonly endlink endverbatim enum example exception \
1971 f$ f[ f] file fn hideinitializer htmlinclude htmlonly \
1972 if image include ingroup internal invariant interface latexonly li line link \
1973 mainpage name namespace nosubgrouping note overload \
1974 p page par param param[in] param[out] \
1975 post pre ref relates remarks return retval \
1976 sa section see showinitializer since skip skipline struct subsection \
1977 test throw throws todo typedef union until \
1978 var verbatim verbinclude version warning weakgroup $ @ \ & < > # { }
1979 keywords3.$(file.patterns.doxygen.langs)=$(keywordclass.doxygen)
1981 # keywords5 is for preprocessor definitions and will cause inactive code
1982 # to be greyed out. This setting is a space separated list of definitions
1983 # where a definition may be of the form NAME=VALUE or simply NAME.
1984 #keywords5.$(file.patterns.cpp)=_MSC_VER SCI_NAMESPACE GTK_MAJOR_VERSION=2
1986 word.chars.cxx=$(chars.alpha)$(chars.numeric)_#
1987 word.characters.$(file.patterns.cpp)=$(word.chars.cxx)
1988 calltip.cpp.word.characters=$(chars.alpha)$(chars.numeric)_
1989 comment.block.cpp=//~
1990 #comment.block.at.line.start.cpp=1
1991 comment.stream.start.cpp=/*
1992 comment.stream.end.cpp=*/
1993 comment.box.start.cpp=/*
1994 comment.box.middle.cpp= *
1995 comment.box.end.cpp= */
1997 # Folding
1998 #fold.cpp.syntax.based=0
1999 #fold.comment=0
2000 #fold.cpp.comment.multiline=0
2001 #fold.cpp.comment.explicit=0
2002 #defaults for fold.cpp.explicit.start=//{ and fold.cpp.explicit.end=//}
2003 #  can be replaced by defining custom strings, e.g. //[ and //]
2004 #fold.cpp.explicit.start=//[
2005 #fold.cpp.explicit.end=//]
2006 #if fold strings are set to something like /*{{{ and /*}}} (Origami/WinF style fold strings), enable
2007 #  fold.cpp.explicit.anywhere, allowing explicit fold points being anywhere, not just in line comments
2008 #fold.cpp.explicit.anywhere=1
2009 #fold.preprocessor=1
2010 #fold.compact=1
2011 #fold.at.else=1
2013 file.patterns.c.except.cpp=$(file.patterns.cs);$(file.patterns.idl);*.java;$(file.patterns.flash);$(file.patterns.ch)
2014 statement.indent.$(file.patterns.c.except.cpp)=5 case default do else for if while
2015 statement.indent.$(file.patterns.cpp)=5 case default do else for if private protected public while
2016 statement.end.$(file.patterns.c.like)=10 ;
2017 statement.lookback.$(file.patterns.c.like)=20
2018 block.start.$(file.patterns.c.like)=10 {
2019 block.end.$(file.patterns.c.like)=10 }
2021 #autocomplete.cpp.fillups=(
2023 #styling.within.preprocessor=1
2024 preprocessor.symbol.$(file.patterns.cpp)=#
2025 preprocessor.start.$(file.patterns.cpp)=if ifdef ifndef
2026 preprocessor.middle.$(file.patterns.cpp)=else elif
2027 preprocessor.end.$(file.patterns.cpp)=endif
2029 preprocessor.symbol.$(file.patterns.cs)=#
2030 preprocessor.start.$(file.patterns.cs)=if region
2031 preprocessor.middle.$(file.patterns.cs)=else elif
2032 preprocessor.end.$(file.patterns.cs)=endif endregion
2034 keywordclass.ch=\
2035 auto array bool break case char class complex ComplexInf ComplexNaN \
2036 const continue default delete \
2037 do double else enum export extern float for foreach goto if Inf inline int \
2038 long namespace NaN new NULL private public register restrict return short \
2039 signed sizeof static string_t struct switch this typedef union unsigned \
2040 using void volatile wchar_t while __declspec
2041 keywords.$(file.patterns.ch)=$(keywordclass.ch)
2042 word.chars.ch=$(chars.alpha)$(chars.numeric)_#
2043 word.characters.$(file.patterns.ch)=$(word.chars.cxx)
2044 comment.block.ch=//~
2045 #comment.block.at.line.start.ch=1
2046 comment.stream.start.ch=/*
2047 comment.stream.end.ch=*/
2048 comment.box.start.ch=/*
2049 comment.box.middle.ch= *
2050 comment.box.end.ch= */
2051 preprocessor.symbol.$(file.patterns.ch)=#
2052 preprocessor.start.$(file.patterns.ch)=if ifdef ifndef
2053 preprocessor.middle.$(file.patterns.ch)=else elif
2054 preprocessor.end.$(file.patterns.ch)=endif
2056 keywordclass.cs=abstract as ascending base bool break by byte case catch char checked \
2057 class const continue decimal default delegate descending do double else enum \
2058 equals event explicit extern false finally fixed float for foreach from goto group if \
2059 implicit in int interface internal into is join lock let long namespace new null \
2060 object on operator orderby out override params private protected public \
2061 readonly ref return sbyte sealed select short sizeof stackalloc static \
2062 string struct switch this throw true try typeof uint ulong \
2063 unchecked unsafe ushort using var virtual void volatile where while
2064 keywords.$(file.patterns.cs)=$(keywordclass.cs)
2065 word.characters.$(file.patterns.cs)=$(word.chars.cxx)
2067 keywordclass.go=\
2068 bool byte break case chan complex64 complex128 const continue defer default  \
2069 else  for func go goto fallthrough false float32 float64 if import int interface int8 int16 int32 int64 \
2070 len map nil package range return select string struct switch true type \
2071 uint uintptr uint8 uint16 uint32 uint64  var
2072 keywords.$(file.patterns.go)=$(keywordclass.go)
2074 keywordclass.rc=\
2075 ACCELERATORS ALT AUTO3STATE AUTOCHECKBOX AUTORADIOBUTTON \
2076 BEGIN BITMAP BLOCK BUTTON CAPTION CHARACTERISTICS CHECKBOX CLASS \
2077 COMBOBOX CONTROL CTEXT CURSOR DEFPUSHBUTTON DIALOG DIALOGEX DISCARDABLE \
2078 EDITTEXT END EXSTYLE FONT GROUPBOX ICON LANGUAGE LISTBOX LTEXT \
2079 MENU MENUEX MENUITEM MESSAGETABLE POPUP \
2080 PUSHBUTTON RADIOBUTTON RCDATA RTEXT SCROLLBAR SEPARATOR SHIFT STATE3 \
2081 STRINGTABLE STYLE TEXTINCLUDE VALUE VERSION VERSIONINFO VIRTKEY
2082 keywords.$(file.patterns.rc)=$(keywordclass.rc)
2084 keywordclass.idl=\
2085 aggregatable allocate appobject arrays async async_uuid \
2086 auto_handle \
2087 bindable boolean broadcast byte byte_count \
2088 call_as callback char coclass code comm_status \
2089 const context_handle context_handle_noserialize \
2090 context_handle_serialize control cpp_quote custom \
2091 decode default defaultbind defaultcollelem \
2092 defaultvalue defaultvtable dispinterface displaybind dllname \
2093 double dual \
2094 enable_allocate encode endpoint entry enum error_status_t \
2095 explicit_handle \
2096 fault_status first_is float \
2097 handle_t heap helpcontext helpfile helpstring \
2098 helpstringcontext helpstringdll hidden hyper \
2099 id idempotent ignore iid_as iid_is immediatebind implicit_handle \
2100 import importlib in include in_line int __int64 __int3264 interface \
2101 last_is lcid length_is library licensed local long \
2102 max_is maybe message methods midl_pragma \
2103 midl_user_allocate midl_user_free min_is module ms_union \
2104 ncacn_at_dsp ncacn_dnet_nsp ncacn_http ncacn_ip_tcp \
2105 ncacn_nb_ipx ncacn_nb_nb ncacn_nb_tcp ncacn_np \
2106 ncacn_spx ncacn_vns_spp ncadg_ip_udp ncadg_ipx ncadg_mq \
2107 ncalrpc nocode nonbrowsable noncreatable nonextensible notify \
2108 object odl oleautomation optimize optional out out_of_line \
2109 pipe pointer_default pragma properties propget propput propputref \
2110 ptr public \
2111 range readonly ref represent_as requestedit restricted retval \
2112 shape short signed size_is small source strict_context_handle \
2113 string struct switch switch_is switch_type \
2114 transmit_as typedef \
2115 uidefault union unique unsigned user_marshal usesgetlasterror uuid \
2116 v1_enum vararg version void wchar_t wire_marshal
2118 keywordclass.msidl=handle
2119 keywordclass.xpidl=attribute native noscript scriptable shared wstring inout
2120 keywords.$(file.patterns.idl)=$(keywordclass.idl) $(keywordclass.xpidl)
2122 # http://java.sun.com/docs/books/tutorial/java/nutsandbolts/_keywords.html
2123 keywordclass.java=abstract assert boolean break byte case catch char class \
2124 const continue default do double else enum extends final finally float for \
2125 goto if implements import instanceof int interface long \
2126 native new package private protected public \
2127 return short static strictfp super switch synchronized this throw throws \
2128 transient try var void volatile while
2129 keywords.$(file.patterns.java)=$(keywordclass.java)
2131 keywordclass.javascript=abstract boolean break byte case catch char class \
2132 const continue debugger default delete do double else enum export extends \
2133 final finally float for function goto if implements import in instanceof \
2134 int interface long native new package private protected public \
2135 return short static super switch synchronized this throw throws \
2136 transient try typeof var void volatile while with
2137 keywords.$(file.patterns.js)=$(keywordclass.javascript)
2139 keywordclass.flash=add and break case catch class continue default delete do \
2140 dynamic else eq extends false finally for function ge get gt if implements import in \
2141 instanceof interface intrinsic le lt ne new not null or private public return \
2142 set static super switch this throw true try typeof undefined var void while with
2144 keywordclass2.flash=Array Arguments Accessibility Boolean Button Camera Color \
2145 ContextMenu ContextMenuItem Date Error Function Key LoadVars LocalConnection Math \
2146 Microphone Mouse MovieClip MovieClipLoader NetConnection NetStream Number Object \
2147 PrintJob Selection SharedObject Sound Stage String StyleSheet System TextField \
2148 TextFormat TextSnapshot Video Void XML XMLNode XMLSocket \
2149 _accProps _focusrect _global _highquality _parent _quality _root _soundbuftime \
2150 arguments asfunction call capabilities chr clearInterval duplicateMovieClip \
2151 escape eval fscommand getProperty getTimer getURL getVersion gotoAndPlay gotoAndStop \
2152 ifFrameLoaded Infinity -Infinity int isFinite isNaN length loadMovie loadMovieNum \
2153 loadVariables loadVariablesNum maxscroll mbchr mblength mbord mbsubstring MMExecute \
2154 NaN newline nextFrame nextScene on onClipEvent onUpdate ord parseFloat parseInt play \
2155 prevFrame prevScene print printAsBitmap printAsBitmapNum printNum random removeMovieClip \
2156 scroll set setInterval setProperty startDrag stop stopAllSounds stopDrag substring \
2157 targetPath tellTarget toggleHighQuality trace unescape unloadMovie unLoadMovieNum updateAfterEvent
2159 keywords.$(file.patterns.flash)=$(keywordclass.flash)
2160 keywords2.$(file.patterns.flash)=$(keywordclass2.flash)
2162 keywordclass.vala=if else switch case default break continue return yield for foreach in \
2163 do while try catch finally throw
2165 keywordclass2.vala=namespace interface class struct enum delegate signal errordomain \
2166 construct get set value base const static var dynamic weak unowned virtual abstract \
2167 override public protected private extern throws requires ensures yields out ref lock \
2168 using true false null delete generic new this typeof sizeof as owned int string char bool
2170 keywords.$(file.patterns.vala)=$(keywordclass.vala)
2171 keywords2.$(file.patterns.vala)=$(keywordclass2.vala)
2173 keywordclass.pike=constant enum if do for while else foreach case switch break continue \
2174 return typeof catch class lambda import inherit static void int string float mixed object \
2175 function program array mapping multiset
2176 keywords.$(file.patterns.pike)=$(keywordclass.pike)
2178 keywordclass.swift.declarations=class deinit enum extension func import init \
2179 internal let operator private protocol public static struct subscript typealias var
2180 keywordclass.swift.statements=break case continue default do else fallthrough \
2181 for if in return switch where while
2182 keywordclass.swift.expressions=as dynamicType false is nil self Self super \
2183 true __COLUMN__ __FILE__ __FUNCTION__ __LINE__
2184 # The contextual keywords are only keywords in particular contexts
2185 keywordclass.swift.contextual=associativity convenience dynamic didSet final get \
2186 infix inout lazy left mutating none nonmutating optional override postfix \
2187 precedence prefix Protocol required right set Type unowned weak willSet
2189 keywords.$(file.patterns.swift)=$(keywordclass.swift.declarations) \
2190 $(keywordclass.swift.statements) $(keywordclass.swift.expressions) \
2191 $(keywordclass.swift.contextual)
2193 # Substyles can be used for extra lists of highlighted identifiers and doc comment keywords
2194 # Identifiers
2195 #substyles.cpp.11=2
2196 #substylewords.11.1.$(file.patterns.cpp)=std map string vector
2197 #style.cpp.11.1=fore:#EE00AA
2198 #style.cpp.75.1=$(style.cpp.75),fore:#BB6666
2199 # Doc comment keywords
2200 #substyles.cpp.17=1
2201 #style.cpp.17.1=$(style.cpp.17),fore:#00AAEE
2202 #style.cpp.81.1=$(style.cpp.81),fore:#6699AA
2203 #substylewords.17.1.$(file.patterns.cpp)=check
2205 # Markers
2206 # keywords6.$(file.patterns.c.like)=FIXME TODO XXX HACK UnresolvedMergeConflict UNDONE
2208 #styling.within.preprocessor=1
2209 #lexer.cpp.allow.dollars=1
2210 #lexer.cpp.track.preprocessor=1
2211 #lexer.cpp.update.preprocessor=1
2212 # For C# leave lexer.cpp.verbatim.strings.allow.escapes as 0 but change to 1 for Objective C
2213 #lexer.cpp.verbatim.strings.allow.escapes=1
2214 #lexer.cpp.triplequoted.strings=1
2215 #lexer.cpp.hashquoted.strings=1
2216 #lexer.cpp.backquoted.strings=1
2217 #lexer.cpp.escape.sequence=1
2219 #lexer.cpp.escape.sequence=1
2221 # C++ styles
2224 # Inactive states are 64 greater than their active counterparts
2227 # Braces are only matched in operator style
2228 braces.cpp.style=10
2230 ccopts=-pedantic -Os
2231 cc=g++ $(ccopts) -c $(FileNameExt) -o $(FileName).o
2232 ccc=gcc $(ccopts) -c $(FileNameExt) -o $(FileName).o
2234 make.command=make
2235 command.compile.*.c=$(ccc) -std=c99
2236 command.build.*.c=$(make.command)
2237 command.build.*.h=$(make.command)
2238 command.clean.*.c=$(make.command) clean
2239 command.clean.*.h=$(make.command) clean
2240 command.go.*.c=./$(FileName)
2241 # To make the Go command both compile (if needed) and execute, use this setting:
2242 #command.go.needs.*.c=gcc $(ccopts) -std=c99 $(FileNameExt) -o $(FileName)
2244 command.compile.$(file.patterns.cplusplus)=$(cc)
2245 command.build.$(file.patterns.cplusplus)=$(make.command)
2246 command.clean.$(file.patterns.cplusplus)=$(make.command) clean
2247 command.go.$(file.patterns.cplusplus)=./$(FileName)
2248 command.go.needs.$(file.patterns.cplusplus)=g++ $(ccopts) $(FileNameExt) -o $(FileName)
2250 command.name.0.$(file.patterns.cpp)=Indent
2251 command.0.$(file.patterns.cpp)=astyle --style=attach --indent=force-tab=8 --keep-one-line-blocks --pad-header --unpad-paren --pad-comma --indent-cases --align-pointer=name $(FileNameExt)
2252 command.is.filter.0.$(file.patterns.cpp)=1
2254 command.name.1.$(file.patterns.cplusplus)=Lint
2255 command.1.$(file.patterns.cplusplus)=g++ -W -Wall -Wshadow -Wwrite-strings -Wold-style-cast \
2256         -Woverloaded-virtual -pedantic -Os -fno-exceptions -c $(FileNameExt)
2258 if PLAT_WIN
2259         command.compile.*.rc=windres $(FileNameExt) $(FileName).o
2260         command.build.*.rc=$(make.command)
2261         command.help.$(file.patterns.cpp)=$(CurrentWord)!G:\Program Files\Microsoft Visual Studio\MSDN98\98VSa\1033\MSDNVS6A.COL
2262         command.help.subsystem.$(file.patterns.cpp)=4
2263         command.go.*.js=cscript /nologo $(FileNameExt)
2264 # When maintaining old Win16 programs...
2265 #       command.help.$(file.patterns.cpp)=$(CurrentWord)!I:\msvc\help\win31wh.hlp
2266 #       command.help.subsystem.$(file.patterns.cpp)=5
2268 if PLAT_GTK
2269         command.help.$(file.patterns.cpp)=man $(CurrentWord) | col -b
2271 if PLAT_WIN
2272         command.build.*.cs=csc /t:winexe $(FileNameExt) /r:system.dll,system.drawing.dll
2273         command.go.*.cs=$(FileName)
2274         command.go.subsystem.*.cs=0
2275 if PLAT_GTK
2276         command.build.*.cs=mcs /t:winexe $(FileNameExt) /r:System,System.Drawing
2277         command.go.*.cs=mono $(FileName).exe
2278         command.go.subsystem.*.cs=1
2280 command.compile.*.java=javac $(FileNameExt)
2281 command.build.*.java=javac *.java
2282 command.go.*.java=java -cp . $(FileName)
2284 if PLAT_WIN
2285         command.help.*.java=http://java.sun.com/javase/6/docs/api/java/util/$(CurrentWord).html
2286         command.help.subsystem.*.java=2
2288 command.compile.*.ch=ch -n $(FileNameExt)
2289 command.build.*.ch=ch -n  $(FileNameExt)
2290 command.go.*.ch=ch -u $(FileNameExt)
2292 command.compile.*.as=mtasc -strict $(FileNameExt)
2293 command.build.*.as=mtasc -strict *.as
2295 command.build.$(file.patterns.vala)=valac $(FileNameExt)
2296 command.go.*.vala=./$(FileName)
2298 # can also be 6g for 64-bit systems!
2299 command.compile.*.go=8g $(FileNameExt)
2300 command.build.*.go=$(make.command)
2301 command.go.*.go=./$(FileName)
2303 command.compile.*.ts=tsc $(FileNameExt)
2307 ###############################################################################
2308 # From csound.properties
2309 # SciTE settings for Csound files (orchestra and score)
2310 # Author:  Georg Ritter <ritterfuture A T gmail D O T com>
2311 # Created: Mai 2005
2313 # Csound files
2314 file.patterns.csound=*.orc;*.sco;*.csd
2315 filter.csound=Csound (orc sco csd)|$(file.patterns.csound)|
2316 *filter.csound=$(filter.csound)
2318 lexer.$(file.patterns.csound)=csound
2320 *language.csound=Csound|orc||
2322 # Csound opcodes
2324 # This list was extracted from Csound_opcodes.vim which can be found here:
2325 # http://csounds.com/istvan/archive/misc/Csound_vim_syntax-4.24.1.tar.gz
2327 csound_opcodes=\
2328         a i db in or zr Add Dec Div Inc Mul Sub abs and cos dam dec div exp \
2329         fin fof fog inh ino inq ins int inx inz lfo log mac mod mul not out \
2330         pan pow rms rnd shl sin sqr sub sum tab tan tb0 tb1 tb2 tb3 tb4 tb5 \
2331         tb6 tb7 tb8 tb9 urd vco xin xor zar zaw zir ziw zkr zkw adsr babo \
2332         buzz cent clip comb cosh diff divz fini fink fmb3 fof2 fold fout \
2333         frac ftsr gain goto in32 inch init line maca moog mute nrpn outc \
2334         outh outo outq outs outx outz peak port pset pvoc rand seed sinh \
2335         sqrt stix tabw tanh tb10 tb11 tb12 tb13 tb14 tb15 tone vadd vco2 \
2336         vdiv vexp vibr vmap vmul vpow wrap xout xyin zacl zarg zawm ziwm \
2337         zkcl zkwm FLbox FLjoy FLrun adsyn ampdb atone birnd bqrez butbp \
2338         butbr buthp butlp clear ctrl7 dbamp dconv delay dumpk endin endop \
2339         event expon fouti foutk ftgen ftlen gauss gbuzz grain guiro igoto \
2340         ihold instr integ kgoto limit linen log10 loopg loopl lpf18 madsr \
2341         max_k metro noise nsamp oscil out32 outch outic outkc outq1 outq2 \
2342         outq3 outq4 outs1 outs2 pareq pitch pluck portk print pvadd randh \
2343         randi rbjeq readk reson rezzy rnd31 scans scanu sense space tab_i \
2344         table tbvcf tempo timek times tival tonek tonex vaddv vbap4 vbap8 \
2345         vbapz vcomb vcopy vdecr vdivv veloc vexpv vibes vincr vmult voice \
2346         vport vpowv vpvoc vsubv vwrap wgbow xadsr zamod zkmod FLhide FLkeyb \
2347         FLknob FLpack FLshow FLtabs FLtext active adsynt alpass areson \
2348         atonek atonex bamboo bbcutm bbcuts biquad cabasa cauchy cggoto \
2349         cigoto ckgoto clfilt cngoto convle cosinv cpsoct cpspch cpstun \
2350         cpuprc cross2 crunch ctrl14 ctrl21 delay1 delayk delayr delayw \
2351         deltap denorm diskin dumpk2 dumpk3 dumpk4 envlpx expseg filesr \
2352         fiopen fmbell follow foscil foutir ftlen2 ftload ftmorf ftsave \
2353         grain2 grain3 harmon hrtfer initc7 interp jitter linenr lineto \
2354         linseg locsig loopge loople lorenz loscil lowres lpread lpslot \
2355         mandel mandol mclock mdelay midic7 midiin midion mirror moscil \
2356         mpulse mrtmsg mxadsr nlfilt noteon notnum ntrpol octave octcps \
2357         octpch opcode oscbnk oscil1 oscil3 oscili osciln oscils oscilx \
2358         outiat outipb outipc outkat outkpb outkpc pchoct phasor planet \
2359         poscil printk prints pvread pvsftr pvsftw random readk2 readk3 \
2360         readk4 reinit resonk resonr resonx resony resonz reverb rigoto \
2361         s16b14 s32b14 sekere sfload sfplay shaker sininv spat3d spdist \
2362         spsend strset table3 tablei tablew tabw_i taninv tigoto timout \
2363         turnon upsamp vbap16 vcella vco2ft vdel_k vdelay vlimit vmultv \
2364         vrandh vrandi wgclar xscans xscanu FLcolor FLcount FLgroup FLlabel \
2365         FLpanel FLvalue aftouch ampdbfs ampmidi aresonk balance bexprnd \
2366         biquada changed clockon cps2pch cpsmidi cpstmid cpstuni cpsxpch \
2367         dbfsamp dcblock deltap3 deltapi deltapn deltapx dispfft display \
2368         envlpxr exprand expsega expsegr filelen filter2 flanger fmmetal \
2369         fmrhode fmvoice follow2 foscili fprints ftchnls ftloadk ftlptim \
2370         ftsavek gogobel granule hilbert initc14 initc21 invalue jitter2 \
2371         jspline linrand linsegr locsend logbtwo loopseg loscil3 lowresx \
2372         lphasor lposcil lpreson lpshold marimba massign midic14 midic21 \
2373         midichn midion2 midiout moogvcf noteoff nreverb nstrnum octmidi \
2374         oscil1i outic14 outipat outkc14 outkpat pcauchy pchbend pchmidi \
2375         phaser1 phaser2 pinkish poisson polyaft poscil3 printk2 printks \
2376         product pvcross pvsanal pvsinfo pvsynth randomh randomi release \
2377         repluck reverb2 rspline rtclock seqtime sfilist sfinstr sfplay3 \
2378         sfplaym sfplist slider8 sndwarp soundin spat3di spat3dt specsum \
2379         streson tableiw tablekt tableng tablera tablewa taninv2 tempest \
2380         tlineto transeg trigger trigseq trirand turnoff unirand valpass \
2381         vco2ift vdelay3 vdelayk vdelayx vexpseg vibrato vlinseg vlowres \
2382         vmirror waveset weibull wgbrass wgflute wgpluck wguide1 wguide2 \
2383         xtratim zakinit FLbutton FLcolor2 FLprintk FLroller FLscroll \
2384         FLsetBox FLsetVal FLslider FLupdate betarand butterbp butterbr \
2385         butterhp butterlp chanctrl clockoff convolve cpsmidib ctrlinit \
2386         cuserrnd deltapxw distort1 downsamp duserrnd filepeak fmpercfl \
2387         fmwurlie fprintks hsboscil lowpass2 lpfreson lpinterp lposcil3 \
2388         maxalloc midictrl multitap nestedap octmidib oscilikt outvalue \
2389         pchmidib powoftwo prealloc pvinterp pvsadsyn pvscross pvsfread \
2390         pvsmaska rireturn samphold schedule semitone sensekey setksmps \
2391         sfinstr3 sfinstrm sfplay3m sfpreset slider16 slider32 slider64 \
2392         slider8f soundout specaddm specdiff specdisp specfilt spechist \
2393         specptrk specscal spectrum sprintks subinstr svfilter tablegpw \
2394         tableikt tablemix tableseg tablewkt tablexkt tb0_init tb1_init \
2395         tb2_init tb3_init tb4_init tb5_init tb6_init tb7_init tb8_init \
2396         tb9_init tempoval vco2init vdelayxq vdelayxs vdelayxw vecdelay \
2397         wgpluck2 wterrain xscanmap zfilter2 FLbutBank FLgetsnap FLpackEnd \
2398         FLprintk2 FLsetFont FLsetSize FLsetText FLsetsnap FLslidBnk \
2399         FLtabsEnd dripwater eventname ktableseg noteondur osciliktp \
2400         oscilikts pgmassign phasorbnk pitchamdf pvbufread readclock \
2401         sandpaper scantable schedwhen sfinstr3m sfpassign slider16f \
2402         slider32f slider64f sndwarpst soundoutc soundouts tablecopy \
2403         tableigpw tableimix tablexseg tb10_init tb11_init tb12_init \
2404         tb13_init tb14_init tb15_init timeinstk timeinsts vbap4move \
2405         vbap8move vbapzmove vdelayxwq vdelayxws xscansmap FLgroupEnd \
2406         FLloadsnap FLpack_end FLpanelEnd FLsavesnap FLsetAlign FLsetColor \
2407         FLsetVal_i FLtabs_end filenchnls noteondur2 scanhammer schedkwhen \
2408         tableicopy tambourine vbap16move vbaplsinit wgbowedbar FLgroup_end \
2409         FLpanel_end FLscrollEnd FLsetColor2 mididefault midinoteoff \
2410         sleighbells FLscroll_end subinstrinit FLsetPosition FLsetTextSize \
2411         FLsetTextType midinoteoncps midinoteonkey midinoteonoct \
2412         midinoteonpch midipitchbend schedwhenname FLsetTextColor \
2413         schedkwhenname midicontrolchange midiprogramchange \
2414         midipolyaftertouch midichannelaftertouch
2416 # Header statements
2417 csound_header_stmts=sr kr ar ksmps nchnls
2419 # Other keywords
2420 csound_other_keywords=
2422 keywords.$(file.patterns.csound)=$(csound_opcodes)
2423 keywords2.$(file.patterns.csound)=$(csound_header_stmts)
2424 keywords3.$(file.patterns.csound)=$(csound_other_keywords)
2426 comment.block.csound=;
2428 # Styles ...
2433 ###############################################################################
2434 # From css.properties
2435 # Define SciTE settings for CSS files
2436 # Jakub Vrána - jakub@vrana.cz
2437 # Updated Andy Holder - Jan 2011
2439 filter.css=CSS (css)|*.css|
2440 *filter.css=$(filter.css)
2441 lexer.*.css=css
2442 *language.css=CSS|css||
2444 indent.size.*.css=4
2445 tab.size.*.css=4
2446 use.tabs.*.css=1
2448 keywordclass.css1=\
2449 color background-color background-image background-repeat background-attachment background-position background \
2450 font-family font-style font-variant font-weight font-size font \
2451 word-spacing letter-spacing text-decoration vertical-align text-transform text-align text-indent line-height \
2452 margin-top margin-right margin-bottom margin-left margin \
2453 padding-top padding-right padding-bottom padding-left padding \
2454 border-top-width border-right-width border-bottom-width border-left-width border-width \
2455 border-top border-right border-bottom border-left border \
2456 border-color border-style width height float clear \
2457 display white-space list-style-type list-style-image list-style-position list-style
2459 keywordclass.values=\
2460 auto none normal italic oblique small-caps bold bolder lighter \
2461 xx-small x-small small medium large x-large xx-large larger smaller \
2462 transparent repeat repeat-x repeat-y no-repeat scroll fixed \
2463 top bottom left center right justify both \
2464 underline overline line-through blink \
2465 baseline sub super text-top middle text-bottom \
2466 capitalize uppercase lowercase thin medium thick \
2467 dotted dashed solid double groove ridge inset outset \
2468 block inline list-item pre no-wrap inside outside \
2469 disc circle square decimal lower-roman upper-roman lower-alpha upper-alpha \
2470 aqua black blue fuchsia gray green lime maroon navy olive purple red silver teal white yellow
2472 # rgb(i1, i2, i3) rgb(p1, p2, p3) #xxx #xxxxxx url(path)
2473 # path: in optional single or double quotes. If quotes, inside quotes must be backslashed.
2474 # length: [+-][0-9]+<unit>
2475 # unit: % pt mm cm pc in px em ex
2477 # at-rule: import
2479 # CSS2
2481 keywordclass.css2=\
2482 border-top-color border-right-color border-bottom-color border-left-color border-color \
2483 border-top-style border-right-style border-bottom-style border-left-style border-style \
2484 top right bottom left position z-index direction unicode-bidi \
2485 min-width max-width min-height max-height overflow clip visibility content quotes \
2486 counter-reset counter-increment marker-offset \
2487 size marks page-break-before page-break-after page-break-inside page orphans widows \
2488 font-stretch font-size-adjust unicode-range units-per-em src \
2489 panose-1 stemv stemh slope cap-height x-height ascent descent widths bbox definition-src \
2490 baseline centerline mathline topline text-shadow \
2491 caption-side table-layout border-collapse border-spacing empty-cells speak-header \
2492 cursor outline outline-width outline-style outline-color \
2493 volume speak pause-before pause-after pause cue-before cue-after cue \
2494 play-during azimuth elevation speech-rate voice-family pitch pitch-range stress richness \
2495 speak-punctuation speak-numeral
2497 keywordclass.values2=\
2498 inherit \
2499 run-in compact marker table inline-table table-row-group table-header-group table-footer-group \
2500 table-row table-column-group table-column table-cell table-caption \
2501 static relative absolute fixed ltr rtl embed bidi-override \
2502 visible hidden scroll collapse open-quote close-quote no-open-quote no-close-quote \
2503 decimal-leading-zero lower-greek lower-latin upper-latin hebrew armenian georgian \
2504 cjk-ideographic hiragana katakana hiragana-iroha katakana-iroha \
2505 landscape portrait crop cross always avoid \
2506 wider narrower ultra-condensed extra-condensed condensed semi-condensed \
2507 semi-expanded expanded extra-expanded ultra-expanded \
2508 caption icon menu message-box small-caption status-bar \
2509 separate show hide once crosshair default pointer move text wait help \
2510 e-resize ne-resize nw-resize n-resize se-resize sw-resize s-resize w-resize \
2511 ActiveBorder ActiveCaption AppWorkspace Background ButtonFace ButtonHighlight ButtonShadow \
2512 InactiveCaptionText ButtonText CaptionText GrayText Highlight HighlightText InactiveBorder \
2513 InactiveCaption InfoBackground InfoText Menu MenuText Scrollbar ThreeDDarkShadow \
2514 ThreeDFace ThreeDHighlight ThreeDLightShadow ThreeDShadow Window WindowFrame WindowText \
2515 silent x-soft soft medium loud x-loud spell-out mix \
2516 left-side far-left center-left center-right far-right right-side behind leftwards rightwards \
2517 below level above higher lower x-slow slow medium fast x-fast faster slower \
2518 male female child x-low low high x-high code digits continuous
2520 # properties and pseudos starting with -moz- etc.
2521 keywordclass.vendor.prefixes=^-moz- ^-webkit- ^-o- ^-ms-
2523 # CSS3 is a set of standards that are currently still begin worked on,
2524 # so this list is certainly incomplete.
2525 # This list is CSS3 as recognised by firefox 4 as of start of 2011
2526 keywordclass.css3=background-size \
2527 border-radius border-top-right-radius border-bottom-right-radius border-bottom-left-radius border-top-left-radius \
2528 box-shadow \
2529 columns column-width column-count column-rule column-gap column-rule-color column-rule-style column-rule-width \
2530 resize opacity word-wrap
2532 # Pseudo Classes
2533 keywordclass.pseudoclass.css1=link active visited
2534 keywordclass.pseudoclass.css2=first-child focus hover lang left right first
2535 keywordclass.pseudoclass.css3=empty enabled disabled checked not root target \
2536 only-child last-child nth-child nth-last-child \
2537 first-of-type last-of-type nth-of-type nth-last-of-type only-of-type \
2538 valid invalid required optional
2539 keywordclass.pseudoclass.other=indeterminate default
2541 # Pseudo Elements
2542 keywordclass.pseudoelement.css=first-letter first-line before after
2543 # ::selection WAS in the css3 standard and is supported in many browsers.
2544 # your choice:
2545 keywordclass.pseudoelement.css3=selection
2546 #keywordclass.pseudoelement.other=selection
2549 # counter(id) counter(id, style) attr(X) local("name)" format("string")
2550 # angle: [+-][0-9]+<unit>
2551 # angle unit: deg grad rad
2552 # time: [0-9]+<unit>
2553 # time unit: ms s
2554 # frequency: [0-9]+<unit>
2555 # frequency unit: Hz kHz
2556 # Unicode range: U+x??-yyy
2558 # at-rule: media, values: all aural braille embossed handheld print projection screen tty tv
2559 # at-rule: page font-face charset
2561 #####
2562 # CSS1 properties
2563 keywords.*.css=$(keywordclass.css1)
2564 # Pseudo classes or more precisely single colon ':' selectors
2565 keywords2.*.css=$(keywordclass.pseudoclass.css1) $(keywordclass.pseudoclass.css2) \
2566     $(keywordclass.pseudoclass.css3) $(keywordclass.pseudoelement.css)
2567 # CSS2 properties
2568 keywords3.*.css=$(keywordclass.css2)
2569 # CSS3 properties
2570 keywords4.*.css=$(keywordclass.css3)
2571 # Pseudo elements or more precisely double colon '::' selectors
2572 keywords5.*.css=$(keywordclass.pseudoelement.css) $(keywordclass.pseudoelement.css3)
2573 # Extra CSS Properties
2574 # Any CSS starting with the common vendor prefixes and microsoft's filter.
2575 keywords6.*.css=$(keywordclass.vendor.prefixes) filter
2576 # Extra pseudo classes
2577 keywords7.*.css=$(keywordclass.pseudoclass.other) $(keywordclass.vendor.prefixes)
2578 # Extra pseudo elements
2579 keywords8.*.css=$(keywordclass.pseudoelement.other) $(keywordclass.vendor.prefixes)
2581 word.characters.*.css=$(chars.alpha)$(chars.numeric)-
2582 comment.stream.start.css=/*
2583 comment.stream.end.css=*/
2586 block.start.*.css=5 {
2587 block.end.*.css=5 }
2591 ###############################################################################
2592 # From d.properties
2593 # Define SciTE settings for D
2595 file.patterns.d=*.d
2596 filter.d=D (d)|$(file.patterns.d)|
2597 *filter.d=$(filter.d)
2598 lexer.$(file.patterns.d)=d
2599 *language.d=D|d||
2601 word.chars.d=$(chars.alpha)$(chars.numeric)_#
2602 word.characters.$(file.patterns.d)=$(word.chars.d)
2603 #~ word.characters.$(file.patterns.cs)=$(word.chars.d)
2604 calltip.d.word.characters=$(chars.alpha)$(chars.numeric)_
2607 #comment.block.at.line.start.d=1
2608 comment.block.d=//~
2609 comment.stream.start.d=/+
2610 comment.stream.end.d=+/
2611 comment.box.start.d=/*
2612 comment.box.middle.d= *
2613 comment.box.end.d= */
2614 #lexer.d.fold.at.else=1
2616 statement.indent.$(file.patterns.d)=6 case catch class debug default do else \
2617 finally for foreach foreach_reverse if private protected public scope struct \
2618 try union while with
2619 statement.end.$(file.patterns.d)=13 ;
2620 statement.lookback.$(file.patterns.d)=20
2621 block.start.$(file.patterns.d)=13 {
2622 block.end.$(file.patterns.d)=13 }
2624 # D keywords
2625 keywords.$(file.patterns.d)=abstract alias align asm assert auto \
2626  body bool break byte \
2627  case cast catch cdouble cent cfloat char class const continue creal \
2628  dchar debug default delegate delete deprecated do double \
2629  else enum export extern \
2630  false final finally float for foreach foreach_reverse function \
2631  goto \
2632  idouble if ifloat import in inout int interface invariant ireal is \
2633  lazy long \
2634  mixin module \
2635  new null \
2636  out override \
2637  package pragma private protected public \
2638  real return \
2639  scope short static struct super switch synchronized \
2640  template this throw true try typedef typeid typeof \
2641  ubyte ucent uint ulong union unittest ushort \
2642  version void volatile \
2643  wchar while with
2645 # keywords2 are intended for embedded ASM
2647 # keywords3 are intended for doxygen
2648 keywords3.$(file.patterns.d)=a addindex addtogroup anchor arg attention \
2649 author b brief bug c class code date def defgroup deprecated dontinclude \
2650 e em endcode endhtmlonly endif endlatexonly endlink endverbatim enum example exception \
2651 f$ f[ f] file fn hideinitializer htmlinclude htmlonly \
2652 if image include ingroup internal invariant interface latexonly li line link \
2653 mainpage name namespace nosubgrouping note overload \
2654 p page par param post pre ref relates remarks return retval \
2655 sa section see showinitializer since skip skipline struct subsection \
2656 test throw todo typedef union until \
2657 var verbatim verbinclude version warning weakgroup $ @ \ & < > # { }
2659 # keywords4 are intended for syntax driven or custom highlighting
2662 # Styles
2664 # 0 - whitespace
2665 # 1, 2, 3, 4 - comments:  /* */,  //,  /** */ or /*! */,  /+ +/
2666 # 5 - number
2667 # 6, 7, 8, 9 - keywords: standard, secondary, doc keywords, typedefs and aliases
2668 # 10 - string
2669 # 11 - string not closed
2670 # 12 - char
2671 # 13 - operator
2672 # 14 - identifier
2673 # 15, 16, 17 - Doc comments: line doc /// or //!, doc keyword, doc keyword err
2674 # 18, 19 stringb, stringr
2675 # breaces must be operator style to allow matching
2676 braces.d.style=13
2679 command.compile.*.d=dmd -O $(FileNameExt)
2680 command.build.*.d=$(make.command)
2681 command.go.*.d=$(FileName)
2686 ###############################################################################
2687 # From ecl.properties
2688 file.patterns.ecl=*.ecl;*.eclattr;*.hql
2689 filter.ecl=ECL (ecl eclattr hql)|$(file.patterns.ecl)|
2690 *filter.ecl=$(filter.ecl)
2691 lexer.$(file.patterns.ecl)=ecl
2693 word.chars.ecl=$(chars.alpha)$(chars.numeric)_#
2694 word.characters.$(file.patterns.ecl)=$(word.chars.ecl)
2695 calltip.ecl.word.characters=$(chars.alpha)$(chars.numeric)_
2697 #comment.block.at.line.start.ecl=1
2698 comment.block.ecl=//
2699 comment.stream.start.ecl=/+
2700 comment.stream.end.ecl=+/
2701 comment.box.start.ecl=/*
2702 comment.box.middle.ecl= *
2703 comment.box.end.ecl= */
2704 #lexer.ecl.fold.at.else=1
2706 statement.indent.$(file.patterns.ecl)=record module
2707 statement.end.$(file.patterns.ecl)=13 ;
2708 statement.lookback.$(file.patterns.ecl)=20
2709 block.start.$(file.patterns.ecl)=13 {
2710 block.end.$(file.patterns.ecl)=13 }
2713 keywords.$(file.patterns.ecl)=abs acos ascii asin asstring atan atan2 ave case choose choosen choosesets clustersize cos cosh count cron dataset dedup denormalize distribute distributed distribution ebcdic enth error evaluate event exists exp fetch fromunicode getisvalid global group hash hash32 hash64 hashcrc hashmd5 if index intformat isvalid iterate join keyunicode length limit ln log map matched matchlength matchposition matchtext matchunicode max merge min normalize parse pipe power preload project pull random rank ranked realformat recordof regexfind regexreplace rejected rollup round roundup row rowdiff sample set sin sinh sizeof soapcall sort sorted sqrt sum table tan tanh topn tounicode transfer trim truncate typeof ungroup unicodeorder which workunit xmldecode xmlencode xmltext xmlunicode
2714 keywords2.$(file.patterns.ecl)=apply build buildindex evaluate fail keydiff keypatch loadxml notify output parallel sequential soapcall
2715 keywords3.$(file.patterns.ecl)=__compressed__ all and any as atmost before beginc++ best between case const counter csv descend encrypt end endc++ endmacro except exclusive expire export extend false few first flat full function group header heading hole ifblock import in joined keep keyed last left limit load local locale lookup macro many maxcount maxlength min skew module named nocase( noroot noscan nosort not of only opt or outer overwrite packed partition penalty physicallength pipe quote record relationship repeat return right scan self separator service shared skew skip sql store terminator thor threshold token transform trim true type unicodeorder unsorted validate virtual whole wild within xml xpath
2716 keywords4.$(file.patterns.ecl)=ascii big_endian boolean data decimal ebcdic integer pattern qstring real record rule set of string token udecimal unicode unsigned varstring varunicode
2717 keywords5.$(file.patterns.ecl)=checkpoint deprecated failcode failmessage failure global independent onwarning persist priority recovery stored success wait when
2718 keywords6.$(file.patterns.ecl)=#append #break #declare #demangle #end #for #getdatatype #if #inmodule #loop #mangle #onwarning #option #set #stored #uniquename #workunit integer symbol value text symbol value
2720 #command.build.$(file.patterns.ecl)=eclcc.exe -I"$(HPCCBIN)\ecllibrary" -I"$(HPCCBIN)\ecllibrary" -I"$(HPCCBIN)\plugins" "$(FileNameExt)"
2724 ###############################################################################
2725 # From eiffel.properties
2726 # Define SciTE settings for Eiffel files.
2728 filter.eiffel=Eiffel (e)|*.e|
2730 *filter.eiffel=$(filter.eiffel)
2732 file.patterns.eiffel=*.e
2734 *source.patterns.eiffel=$(file.patterns.eiffel);
2736 # Main Eiffel lexer dows indentation based folding
2737 lexer.$(file.patterns.eiffel)=eiffel
2738 # Alternative key word based folding has trouble with redefine and rename clauses
2739 #lexer.$(file.patterns.eiffel)=eiffelkw
2741 *language.eiffel=&Eiffel|e||
2743 # These keywords are case insensitive although Eiffel has conventions for
2744 # keywords, predefined names and predefined classes: alias, Current, BOOLEAN
2745 # Could differentiate between these
2746 keywordclass.eiffel=\
2747 alias all and any as bit boolean \
2748 check class character clone create creation current \
2749 debug deferred div do double \
2750 else elseif end ensure equal expanded export external \
2751 false feature forget from frozen general \
2752 if implies indexing infix inherit inspect integer invariant is \
2753 language like local loop mod name nochange none not \
2754 obsolete old once or platform pointer prefix precursor \
2755 real redefine rename require rescue result retry \
2756 select separate string strip then true undefine unique until \
2757 variant void when xor
2759 keywords.$(file.patterns.eiffel)=$(keywordclass.eiffel)
2761 # Eiffel styles
2762 # Braces are only matched in operator style
2763 braces.eiffel.style=6
2764 braces.eiffelkw.style=$(braces.eiffel.style)
2766 statement.indent.$(file.patterns.eiffel)=3 do else elsif rescue if is loop
2767 statement.end.$(file.patterns.eiffel)=10 ;
2768 statement.lookback.$(file.patterns.eiffel)=20
2769 block.start.$(file.patterns.eiffel)=10 check debug deferred do from if inspect once
2770 block.end.$(file.patterns.eiffel)=10 end
2772 command.compile.*.e=compile $(FileName)
2775 ###############################################################################
2776 # From erlang.properties
2777 # Define SciTE settings for Erlang files.
2779 # M: Erlang M-Files
2780 file.patterns.erlang=*.erl;*.hrl
2782 # M: Erlang M-Files
2783 filter.erlang=Erlang (erl hrl)|$(file.patterns.erlang)|
2785 *filter.erlang=$(filter.erlang)
2787 lexer.$(file.patterns.erlang)=erlang
2789 #*language.erlang=Erlang|erl||
2791 # Reserved Erlang words
2792 keywords.$(file.patterns.erlang)=after and andalso band begin bnot bor bsl bsr bxor case catch cond div end fun if let not of or orelse query receive rem try when xor
2793 # Erlang built-in functions (BIFs)
2794 keywords2.$(file.patterns.erlang)=erlang: abs adler32 adler32_combine erlang:append_element apply atom_to_binary atom_to_list binary_to_atom binary_to_existing_atom binary_to_list bitstring_to_list binary_to_term bit_size erlang:bump_reductions byte_size erlang:cancel_timer check_process_code concat_binary crc32 crc32_combine date decode_packet delete_module erlang:demonitor disconnect_node erlang:display element erase erlang:error exit float float_to_list erlang:fun_info erlang:fun_to_list erlang:function_exported garbage_collect get erlang:get_cookie get_keys erlang:get_stacktrace group_leader halt erlang:hash hd erlang:hibernate integer_to_list erlang:integer_to_list iolist_to_binary iolist_size is_alive is_atom is_binary is_bitstring is_boolean erlang:is_builtin is_float is_function is_integer is_list is_number is_pid is_port is_process_alive is_record is_reference is_tuple length link list_to_atom list_to_binary list_to_bitstring list_to_existing_atom list_to_float list_to_integer erlang:list_to_integer list_to_pid list_to_tuple load_module erlang:load_nif erlang:loaded erlang:localtime erlang:localtime_to_universaltime make_ref erlang:make_tuple erlang:max erlang:md5 erlang:md5_final erlang:md5_init erlang:md5_update erlang:memory erlang:min module_loaded erlang:monitor monitor_node node nodes now open_port erlang:phash erlang:phash2 pid_to_list port_close port_command erlang:port_command port_connect port_control erlang:port_call erlang:port_info erlang:port_to_list erlang:ports pre_loaded erlang:process_display process_flag process_info processes purge_module put erlang:raise erlang:read_timer erlang:ref_to_list register registered erlang:resume_process round self erlang:send erlang:send_after erlang:send_nosuspend erlang:set_cookie setelement size spawn spawn_link spawn_monitor spawn_opt split_binary erlang:start_timer statistics erlang:suspend_process erlang:system_flag erlang:system_info erlang:system_monitor erlang:system_profile term_to_binary throw time tl erlang:trace erlang:trace_delivered erlang:trace_info erlang:trace_pattern trunc tuple_size tuple_to_list erlang:universaltime erlang:universaltime_to_localtime unlink unregister whereis erlang:yield
2795 # Erlang preprocessor instructions
2796 keywords3.$(file.patterns.erlang)=-define -else -endif -ifdef -ifndef -include -include_lib -undef
2797 # Erlang module attributes
2798 keywords4.$(file.patterns.erlang)=-behavior -behaviour -compile -created -created_by -export -file -import -module -modified -modified_by -record -revision -spec -type -vsn
2799 # Erlang documentation helpers
2800 keywords5.$(file.patterns.erlang)=@author @clear @copyright @deprecated @doc @docfile @end @equiv @headerfile @hidden @private @reference @see @since @spec @throws @title @todo @TODO @type @version
2801 # Erlang documentation macros
2802 keywords6.$(file.patterns.erlang)=@date @docRoot @link @module @package @section @time @type @version
2804 # Comment start
2805 comment.block.erlang=%~
2807 # Erlang styles
2808 # foreground;background;bold;italic
2811 # Comments
2812 #---------------------------
2814 # Types
2815 #---------------------------
2817 # Special
2818 #---------------------------
2822 ###############################################################################
2823 # From escript.properties
2824 # the directory of the ecompile.exe
2825 ECOMPILEHOME=C:\Daten\Code\CVS Workspace\etheria-pol095\scripts
2828 # Define SciTE settings for ESCRIPT files.
2830 filter.escript=E-Script (src em)|$(file.patterns.escript)|
2831 #filter.escript=E-Script (src inc cfg em)|$(file.patterns.escript)|
2832 *filter.escript=$(filter.escript)
2834 file.patterns.escript=*.src;*.em
2835 #file.patterns.escript=*.src;*.inc;*.cfg;*.em
2837 lexer.$(file.patterns.escript)=escript
2838 escript.case.sensitive=0
2841 command.compile.*.src="$(ECOMPILEHOME)\ecompile.exe" $(FileNameExt)
2843 #~ Braces are only matched in brace style
2844 #braces.escript.style=9
2848 keywords.$(file.patterns.escript)=\
2849 basic basicio boats \
2850 cfgfile \
2851 file \
2852 http \
2853 npc \
2854 os \
2855 uo util \
2856 accessible \
2857 addmenuitem \
2858 appendconfigfileelem \
2859 applyconstraint \
2860 applydamage \
2861 applyrawdamage \
2862 assignrecttoweatherregion \
2863 append \
2864 baseskilltorawskill \
2865 boatfromitem \
2866 broadcast \
2867 ban \
2868 cdbl \
2869 cint \
2870 cstr \
2871 checklineofsight \
2872 checklosat \
2873 checkskill \
2874 consumemana \
2875 consumereagents \
2876 consumesubstance \
2877 createaccount \
2878 createitematlocation \
2879 createiteminbackpack \
2880 createitemininventory \
2881 createitemincontainer \
2882 createmenu \
2883 createmultiatlocation \
2884 createnpcfromtemplate \
2885 createrootiteminstoragearea \
2886 createstoragearea \
2887 clear_script_profile_counters \
2888 close \
2889 damage \
2890 destroyitem \
2891 destroymulti \
2892 destroyrootiteminstoragearea \
2893 detach \
2894 disableevents \
2895 disconnectclient \
2896 distance \
2897 disable \
2898 enableevents \
2899 enumerateitemsincontainer \
2900 enumerateonlinecharacters \
2901 equipfromtemplate \
2902 equipitem \
2903 eraseglobalproperty \
2904 eraseobjproperty \
2905 enable \
2906 enabled \
2907 erase \
2908 events_waiting \
2909 exists \
2910 findconfigelem \
2911 findobjtypeincontainer \
2912 findrootiteminstoragearea \
2913 findstoragearea \
2914 fclose \
2915 find \
2916 fopen \
2917 fread \
2918 fseek \
2919 ftell \
2920 fwrite \
2921 gamestat \
2922 getamount \
2923 getcommandhelp \
2924 getconfigint \
2925 getconfigintkeys \
2926 getconfigmaxintkey \
2927 getconfigreal \
2928 getconfigstring \
2929 getconfigstringkeys \
2930 getconfigstringarray \
2931 getelemproperty \
2932 getequipmentbylayer \
2933 getglobalproperty \
2934 getharvestdifficulty \
2935 getmapinfo \
2936 getmenuobjtypes \
2937 getobjproperty \
2938 getobjtype \
2939 getobjtypebyname \
2940 getproperty \
2941 getrawskill \
2942 getregionstring \
2943 getskill \
2944 getspelldifficulty \
2945 getstandingheight \
2946 getworldheight \
2947 grantprivilege \
2948 harvestresource \
2949 healdamage \
2950 hex \
2951 islegalmove \
2952 insert \
2953 keys \
2954 listequippeditems \
2955 listghostsnearlocation \
2956 listhostiles \
2957 listitemsatlocation \
2958 listitemsnearlocation \
2959 listitemsnearlocationoftype \
2960 listmobilesinlineofsight \
2961 listmobilesnearlocation \
2962 listmobilesnearlocationex \
2963 listobjectsinbox \
2964 loadtusscpfile \
2965 left \
2966 len \
2967 log_profile \
2968 lower \
2969 makeboundingbox \
2970 move \
2971 moveboat \
2972 moveboatrelative \
2973 movecharactertolocation \
2974 moveitemtocontainer \
2975 moveitemtolocation \
2976 move_offline_mobiles \
2977 openpaperdoll \
2978 open \
2979 pack \
2980 performaction \
2981 playlightningbolteffect \
2982 playmovingeffect \
2983 playmovingeffectxyz \
2984 playobjectcenteredeffect \
2985 playsoundeffect \
2986 playsoundeffectprivate \
2987 playstationaryeffect \
2988 printtextabove \
2989 printtextaboveprivate \
2990 packages \
2991 polcore \
2992 position \
2993 print \
2994 queryparam \
2995 randomdiceroll \
2996 randomint \
2997 rawskilltobaseskill \
2998 readconfigfile \
2999 readgameclock \
3000 releaseitem \
3001 registerforspeechevents \
3002 registeritemwithboat \
3003 requestinput \
3004 reserveitem \
3005 restartscript \
3006 resurrect \
3007 revokeprivilege \
3008 runawayfrom \
3009 runawayfromlocation \
3010 runtoward \
3011 runtowardlocation \
3012 reverse \
3013 run_script_to_completion \
3014 saveworldstate \
3015 selectmenuitem2 \
3016 self \
3017 sendbuywindow \
3018 senddialoggump \
3019 sendevent \
3020 sendopenspecialcontainer \
3021 sendpacket \
3022 sendsellwindow \
3023 sendskillwindow \
3024 sendstringastipwindow \
3025 sendsysmessage \
3026 sendtextentrygump \
3027 setanchor \
3028 setglobalproperty \
3029 setname \
3030 setobjproperty \
3031 setopponent \
3032 setproperty \
3033 setrawskill \
3034 setregionlightlevel \
3035 setregionweatherlevel \
3036 setscriptcontroller \
3037 setwarmode \
3038 shutdown \
3039 speakpowerwords \
3040 splitwords \
3041 startspelleffect \
3042 subtractamount \
3043 systemfindboatbyserial \
3044 systemfindobjectbyserial \
3045 say \
3046 set_critical \
3047 set_debug \
3048 set_priority \
3049 set_priority_divide \
3050 set_script_option \
3051 setcmdlevel \
3052 setdex \
3053 setint \
3054 setlightlevel \
3055 setmaster \
3056 setname \
3057 setpassword \
3058 setstr \
3059 shrink \
3060 size \
3061 sleep \
3062 sleepms \
3063 sort \
3064 spendgold \
3065 squelch \
3066 start_script \
3067 syslog \
3068 system_rpm \
3069 target \
3070 targetcoordinates \
3071 targetmultiplacement \
3072 turnawayfrom \
3073 turnawayfromlocation \
3074 turnboat \
3075 turntoward \
3076 turntowardlocation \
3077 toggle \
3078 unloadconfigfile \
3079 unpack \
3080 unban \
3081 unload_scripts \
3082 upper \
3083 walkawayfrom \
3084 walkawayfromlocation \
3085 walktoward \
3086 walktowardlocation \
3087 wander \
3088 writehtml \
3089 writehtmlraw \
3090 wait_for_event \
3091 movechar_forcelocation \
3092 moveitem_forcelocation \
3093 moveitem_normal \
3094 scriptopt_debug \
3095 scriptopt_no_interrupt \
3096 scriptopt_no_runaway \
3097 te_cancel_disable \
3098 te_cancel_enable \
3099 te_style_disable \
3100 te_style_normal \
3101 te_style_numerical \
3102 tgtopt_check_los \
3103 tgtopt_harmful \
3104 tgtopt_helpful \
3105 tgtopt_neutral \
3106 tgtopt_nocheck_los \
3107 setprop \
3108 getprop
3111 keywords2.$(file.patterns.escript)=\
3112 array \
3113 const \
3114 dictionary \
3115 global \
3116 local \
3117 var \
3118 and \
3119 default \
3120 in \
3121 next not \
3122 or \
3123 return \
3124 to \
3125 include \
3126 use \
3127 enum
3130 keywords3.$(file.patterns.escript)=\
3131 while \
3132 for \
3133 endfor \
3134 function \
3135 program \
3136 endprogram endfunction \
3137 foreach \
3138 case \
3139 else elseif \
3140 if endcase endenum endforeach endif endwhile
3146 ###############################################################################
3147 # From flagship.properties
3148 # Define SciTE settings for Harbour and FlagShip files.
3149 # (Syntactically compatible to other XBase dialects, like dBase, Clipper, Fox etc.)
3150 # Based on Version .02 by Randy Butler.
3152 # FlagShip Source code file
3153 file.patterns.flagship=*.prg
3155 lexer.$(file.patterns.flagship)=flagship
3157 *language.flagship=FlagShip|prg||
3159 # FlagShip 6 Commands
3160 keywordclass.fs6commands=\
3161 ? @ accept access all alternate announce ansi any append as assign autolock average \
3162 begin bell bitmap blank box \
3163 call cancel case century charset checkbox clear close cls color combobox commit \
3164 confirm console constant continue copy count create cursor \
3165 date dbread dbwrite decimals declare default delete deleted delimiters device dir \
3166 directory display do draw \
3167 edit else elseif eject end endcase enddo endif endtext epoch erase error escape eval eventmask \
3168 exact exclusive extended external extra \
3169 field file filter find fixed font for form format from \
3170 get gets global global_extern go goto gotop guialign guicolor guicursor guitransl \
3171 html htmltext \
3172 if image index input intensity \
3173 join \
3174 key keyboard keytransl \
3175 label lines list listbox local locate \
3176 margin memory memvar menu message method multibyte multilocks \
3177 next nfs nfslock nfs_force note \
3178 on openerror order outmode \
3179 pack parameters path pixel pop printer private prompt public push pushbutton \
3180 quit \
3181 radiobutton radiogroup read recall refresh reindex relation release rename replace report request restore \
3182 richtext rowadapt rowalign run \
3183 save say scoreboard scrcompress screen seek select sequence set setenhanced setstandard setunselected \
3184 skip softseek sort source static store struct structure sum \
3185 tag tbrowse text to total type typeahead \
3186 unique unlock update use \
3187 wait while with wrap \
3188 xml zap zerobyteout
3190 # FlagShip 6 Std Library Functions
3191 keywordclass.fs6libfunc=\
3192 _displarr _displarrerr _displarrstd _displobj _displobjerr _displobjstd \
3193 aadd abs achoice aclone acopy adel adir aelemtype aeval afields afill ains alert alias alltrim altd ansi2oem \
3194 appiomode appmdimode appobject array asc ascan asize asort at atail atanychar autoxlock \
3195 between bin2i bin2l bin2w binand binlshift binor binrshift binxor bof break browse \
3196 cdow chr chr2screen cmonth col col2pixel color2rgb colorselect colvisible consoleopen consolesize crc32 ctod curdir \
3197 date datevalid day dbappend dbclearfilter dbclearindex dbclearrelation dbcloseall dbclosearea dbcommit dbcommitall \
3198 dbcreate dbcreateindex dbdelete dbedit dbeval dbf dbfilter dbfinfo dbflock dbfused dbgetlocate dbgobottom dbgoto \
3199 dbgotop dbobject dbrecall dbreindex dbrelation dbrlock dbrlocklist dbrselect dbrunlock dbseek dbselectarea \
3200 dbsetdriver dbsetfilter dbsetindex dbsetlocate dbsetorder dbsetrelation dbskip dbstruct dbunlock dbunlockall \
3201 dbusearea default deleted descend devout devoutpict devpos directory diskspace dispbegin dispbox dispcount \
3202 dispend dispout doserror doserror2str dow drawline dtoc dtos \
3203 empty eof errorblock errorlevel eval execname execpidnum exp \
3204 fattrib fclose fcount fcreate ferase ferror ferror2str fieldblock fielddeci fieldget fieldgetarr fieldlen fieldname \
3205 fieldpos fieldput fieldputarr fieldtype fieldwblock file findexefile fklabel fkmax flagship_dir flock flockf fopen \
3206 found fread freadstdin freadstr freadtxt frename fs_set fseek fwrite \
3207 getactive getalign getapplykey getdosetkey getenv getenvarr getfunction getpostvalid getprevalid getreader guidrawline \
3208 hardcr header hex2num \
3209 i2bin iif indexcheck indexcount indexdbf indexext indexkey indexnames indexord infobox inkey inkey2read inkey2str inkeytrap \
3210 instdchar instdstring int int2num isalpha isbegseq iscolor isdbexcl isdbflock isdbmultip isdbmultiple isdbmultipleopen \
3211 isdbrlock isdigit isfunction isguimode islower isobjclass isobjequiv isobjproperty isprinter isupper \
3212 l2bin lastkey lastrec left len listbox lock log lower ltrim lupdate \
3213 macroeval macrosubst max max_col max_row maxcol maxrow mcol mdblck mdiclose mdiopen mdiselect memocode memodecode \
3214 memoedit memoencode memoline memoread memory memotran memowrit memvarblock mhide min minmax mlcount mlctopos mleftdown \
3215 mlpos mod month mpostolc mpresent mreststate mrightdown mrow msavestate msetcursor msetpos mshow mstate \
3216 neterr netname nextkey num2hex num2int \
3217 objclone oem2ansi onkey ordbagext ordbagname ordcond ordcondset ordcreate orddescend orddestroy ordfor ordisinique \
3218 ordkey ordkeyadd ordkeycount ordkeydel ordkeygoto ordkeyno ordkeyval ordlistadd ordlistclear ordlistrebui ordname \
3219 ordnumber ordscope ordsetfocu ordsetrelat ordskipunique os outerr outstd \
3220 padc padl padr param parameters pcalls pcol pcount pixel2col pixel2row printstatus procfile procline procname procstack proper prow \
3221 qout qout2 qqout qqout2 \
3222 rat rddlist rddname rddsetdefault readexit readinsert readkey readkill readmodal readsave readupdated readvar reccount recno recsize \
3223 replicate restscreen right rlock rlockverify round row row2pixel rowadapt rowvisible rtrim \
3224 savescreen scrdos2unix screen2chr scroll scrunix2dos seconds secondscpu select serial set setansi setblink setcancel setcol2get \
3225 setcolor setcolorba setcursor setevent setguicursor setkey setmode setpos setprc setvarempty sleep sleepms soundex space \
3226 sqrt statbarmsg statusmessage stod str strlen strlen2col strlen2pix strlen2space strpeek strpoke strtran strzero stuff substr \
3227 tbcolumnnew tbmouse tbrowsearr tbrowsedb tbrowsenew tempfilename time tone transform trim truepath type \
3228 updated upper used usersactive usersdbf usersmax \
3229 val valtype version \
3230 webdate weberrorhandler webgetenvir webgetformdata webhtmlbegin webhtmlend weblogerr webmaildomain weboutdata websendmail word \
3231 year
3233 # FlagShip 6 function and procedure
3234 keywordclass.fs6funcproc=\
3235 function procedure return exit
3237 # FlagShip 6 Class (OOP)
3238 keywordclass.fs6class=\
3239 class instance export hidden protect prototype
3241 # Doxygen keywords
3242 keywordclass.fs6doxygen=a addindex addtogroup anchor arg attention \
3243 author b brief bug c class code date def defgroup deprecated dontinclude \
3244 e em endcode endhtmlonly endif endlatexonly endlink endverbatim enum example exception \
3245 f$ f[ f] file fn hideinitializer htmlinclude htmlonly \
3246 if image include ingroup internal invariant interface latexonly li line link \
3247 mainpage name namespace nosubgrouping note overload \
3248 p page par param param[in] param[out] \
3249 post pre ref relates remarks return retval \
3250 sa section see showinitializer since skip skipline struct subsection \
3251 test throw throws todo typedef union until \
3252 var verbatim verbinclude version warning weakgroup $ @ \ & < > # { }
3254 keywords.$(file.patterns.flagship)=$(keywordclass.fs6commands)
3255 keywords2.$(file.patterns.flagship)=$(keywordclass.fs6libfunc)
3256 keywords3.$(file.patterns.flagship)=$(keywordclass.fs6funcproc)
3257 keywords4.$(file.patterns.flagship)=$(keywordclass.fs6class)
3258 keywords5.$(file.patterns.flagship)=$(keywordclass.fs6doxygen)
3260 #FlagShip Comments
3261 #comment.block.flagship='/
3262 comment.block.flagship=//~
3263 comment.stream.start.flagship=/*
3264 comment.stream.end.flagship=*/
3265 comment.box.start.flagship=/*
3266 comment.box.middle.flagship= *
3267 comment.box.end.flagship= */
3269 #lexer.flagship.styling.within.preprocessor=0
3271 # FlagShip styles
3276 #FlagShip Compiler Option
3277 fsOptObj=-c -q -w1 -w2 -w3
3278 fsOptExe=-q -w1 -w2 -w3
3280 #Command for obj file
3281 fsObj=FlagShip $(fsOptObj) $(FileNameExt) -o $(FileName).o
3283 #Command for exe file
3284 fsExe=FlagShip $(fsOptExe) $(FileNameExt) -o $(FileName)
3286 # Use flagship without make file
3287 command.compile.*.prg=$(fsObj)
3288 command.build.*.prg=$(fsExe)
3289 command.go.*.prg=$(FileName)
3291 # Use flagship with a make file
3292 #make.command=make
3293 #command.compile.*.prg=$(make.command)
3294 #command.build.*.prg=$(make.command)
3295 #command.go.*.prg=$(FileName)
3296 #command.build.*.ch=$(make.command)
3297 #command.build.*.fh=$(make.command)
3299 # help from fsman
3300 command.help.$(file.patterns.flagship)=fsman
3304 ###############################################################################
3305 # From forth.properties
3306 # Define SciTE settings for Forth files
3308 # These patterns conflict with fortran.properties and nncrontab.properties
3309 # so disable these other properties files if you want to use forth.
3310 #file.patterns.forth=*.f;*.spf
3311 file.patterns.forth=*.forth
3313 # add '*.tab;*.spf;' to 'source.files' variable in 'SciTEGlobal.properties'
3314 # if you want to include these file patterns into default source file list
3316 lexer.$(file.patterns.forth)=forth
3318 *language.forth=Forth|forth||
3320 filter.forth=Forth files (f spf)|$(file.patterns.forth)|
3322 *filter.forth=$(filter.forth)
3324 word.characters.$(file.patterns.forth)=$(chars.alpha)$(chars.numeric)%-
3326 comment.block.forth=\
3327 #comment.block.at.line.start.forth=0
3328 comment.stream.start.forth=(
3329 comment.stream.end.forth=)
3330 comment.box.start.forth=\
3331 comment.box.middle.forth=\
3332 comment.box.end.forth=\
3334 # Forth styles
3336 # control keywords Forth
3337 keywords.$(file.patterns.forth)=\
3338 AGAIN BEGIN CASE DO ELSE ENDCASE ENDOF IF LOOP OF REPEAT THEN UNTIL  WHILE \
3339 [IF] [ELSE] [THEN] ?DO
3341 # Keywords
3342 keywords2.$(file.patterns.forth)=\
3343 DUP DROP ROT SWAP OVER @ ! 2@ 2! 2DUP 2DROP 2SWAP 2OVER NIP R@ >R R> 2R@ 2>R 2R> \
3344 0= 0< SP@ SP! W@ W! C@ C! < > = <> 0<>\
3345 SPACE SPACES KEY? KEY THROW CATCH ABORT */ 2* /MOD CELL+ CELLS CHAR+ \
3346 CHARS MOVE ERASE DABS TITLE HEX DECIMAL HOLD <# # #S #> SIGN \
3347 D. . U. DUMP (.") >NUMBER ' IMMEDIATE EXIT RECURSE UNLOOP LEAVE HERE ALLOT , \
3348 C, W, COMPILE, BRANCH, RET, LIT, DLIT, ?BRANCH, ", >MARK >RESOLVE1 <MARK >RESOLVE \
3349 ALIGN ALIGNED USER-ALLOT USER-HERE HEADER DOES> SMUDGE HIDE :NONAME LAST-WORD \
3350 ?ERROR ERROR2 FIND1 SFIND SET-CURRENT GET-CURRENT DEFINITIONS GET-ORDER FORTH \
3351 ONLY SET-ORDER ALSO PREVIOUS VOC-NAME. ORDER LATEST LITERAL 2LITERAL SLITERAL \
3352 CLITERAL ?LITERAL1 ?SLITERAL1 HEX-LITERAL HEX-SLITERAL ?LITERAL2 ?SLITERAL2 SOURCE \
3353 EndOfChunk CharAddr PeekChar IsDelimiter GetChar OnDelimiter SkipDelimiters OnNotDelimiter \
3354 SkipWord SkipUpTo ParseWord NextWord PARSE SKIP CONSOLE-HANDLES REFILL DEPTH ?STACK \
3355 ?COMP WORD INTERPRET BYE QUIT MAIN1 EVALUATE INCLUDE-FILE INCLUDED >BODY +WORD \
3356 WORDLIST CLASS! CLASS@ PAR! PAR@ ID. ?IMMEDIATE ?VOC IMMEDIATE VOC WordByAddrWl \
3357 WordByAddr NLIST WORDS SAVE OPTIONS /notransl ANSI>OEM ACCEPT EMIT CR TYPE EKEY? \
3358 EKEY EKEY>CHAR EXTERNTASK ERASE-IMPORTS ModuleName ModuleDirName ENVIRONMENT? \
3359 DROP-EXC-HANDLER SET-EXC-HANDLER HALT ERR CLOSE-FILE CREATE-FILE CREATE-FILE-SHARED \
3360 OPEN-FILE-SHARED DELETE-FILE FILE-POSITION FILE-SIZE OPEN-FILE READ-FILE REPOSITION-FILE \
3361 DOS-LINES UNIX-LINES READ-LINE WRITE-FILE RESIZE-FILE WRITE-LINE ALLOCATE FREE RESIZE \
3362 START SUSPEND RESUME STOP PAUSE MIN MAX TRUE FALSE ASCIIZ> \
3363 R/O W/O ;CLASS ENDWITH OR AND /STRING SEARCH COMPARE EXPORT ;MODULE SPACE
3365 # defwords
3366 keywords3.$(file.patterns.forth)=\
3367 VARIABLE CREATE : VALUE CONSTANT VM: M: var dvar chars OBJ \
3368 CONSTR: DESTR: CLASS: OBJECT: POINTER \
3369 USER USER-CREATE USER-VALUE VECT \
3370 WNDPROC: VOCABULARY -- TASK: CEZ: MODULE:
3372 # prewords1
3373 keywords4.$(file.patterns.forth)=\
3374 CHAR [CHAR] POSTPONE WITH ['] TO [COMPILE] CHAR ASCII \'
3376 # prewords2
3377 keywords5.$(file.patterns.forth)=\
3378 REQUIRE WINAPI:
3380 # string words
3381 keywords6.$(file.patterns.forth)=\
3382 S" ABORT" Z" " ." C"
3385 #command.compile.*.f=spf.cmd $(FileNameExt)
3389 ###############################################################################
3390 # From fortran.properties
3391 # Define SciTE settings for Fortran files.
3393 filter.fortran=Fortran (f for f90 f95 f2k)|*.f;*.for;*.f90;*.f95;*.f2k|
3395 *filter.fortran=$(filter.fortran)
3397 file.patterns.f95=*.f90;*.f95;*.f2k
3398 file.patterns.f77=*.f;*.for
3399 file.patterns.fortran=$(file.patterns.f95);$(file.patterns.f77)
3401 lexer.$(file.patterns.f95)=fortran
3402 lexer.$(file.patterns.f77)=f77
3404 *language.fortran=&Fortran|f90||
3406 # keywords and input/output specifiers
3407 keywordclass.fortran=access action advance allocatable allocate \
3408 apostrophe assign assignment associate asynchronous backspace \
3409 bind blank blockdata call case character class close common \
3410 complex contains continue critical cycle data deallocate decimal delim \
3411 default dimension direct do dowhile double doubleprecision else \
3412 elseif elsewhere encoding end endassociate endblockdata enddo \
3413 endfile endforall endfunction endif endinterface endmodule endprogram \
3414 endselect endsubroutine endtype endwhere entry eor equivalence \
3415 err errmsg exist exit external file flush fmt forall form format \
3416 formatted function go goto id if implicit in include inout \
3417 integer inquire intent interface intrinsic iomsg iolength \
3418 iostat is kind len logical module name named namelist nextrec nml \
3419 none nullify number only open opened operator optional out pad \
3420 parameter pass pause pending pointer pos position precision \
3421 print private procedure program protected public quote read readwrite \
3422 real rec recl recursive result return rewind save select \
3423 selectcase selecttype sequential sign size stat status stop stream \
3424 subroutine target then to type unformatted unit use value \
3425 volatile wait where while write
3427 keywords.$(file.patterns.f95)=$(keywordclass.fortran)
3428 keywords.$(file.patterns.f77)=$(keywordclass.fortran)
3430 # keywords2 is for highlighting intrinsic and extended functions
3431 keywords2.$(file.patterns.fortran)=abs achar acos acosd adjustl adjustr \
3432 aimag aimax0 aimin0 aint ajmax0 ajmin0 akmax0 akmin0 all allocated alog \
3433 alog10 amax0 amax1 amin0 amin1 amod anint any asin asind associated \
3434 atan atan2 atan2d atand bitest bitl bitlr bitrl bjtest bit_size bktest break \
3435 btest cabs ccos cdabs cdcos cdexp cdlog cdsin cdsqrt ceiling cexp char \
3436 clog cmplx conjg cos cosd cosh count cpu_time cshift csin csqrt dabs \
3437 dacos dacosd dasin dasind datan datan2 datan2d datand date \
3438 date_and_time dble dcmplx dconjg dcos dcosd dcosh dcotan ddim dexp \
3439 dfloat dflotk dfloti dflotj digits dim dimag dint dlog dlog10 dmax1 dmin1 \
3440 dmod dnint dot_product dprod dreal dsign dsin dsind dsinh dsqrt dtan dtand \
3441 dtanh eoshift epsilon errsns exp exponent float floati floatj floatk floor fraction \
3442 free huge iabs iachar iand ibclr ibits ibset ichar idate idim idint idnint ieor ifix \
3443 iiabs iiand iibclr iibits iibset iidim iidint iidnnt iieor iifix iint iior iiqint iiqnnt iishft \
3444 iishftc iisign ilen imax0 imax1 imin0 imin1 imod index inint inot int int1 int2 int4 \
3445 int8 iqint iqnint ior ishft ishftc isign isnan izext jiand jibclr jibits jibset jidim jidint \
3446 jidnnt jieor jifix jint jior jiqint jiqnnt jishft jishftc jisign jmax0 jmax1 jmin0 jmin1 \
3447 jmod jnint jnot jzext kiabs kiand kibclr kibits kibset kidim kidint kidnnt kieor kifix \
3448 kind kint kior kishft kishftc kisign kmax0 kmax1 kmin0 kmin1 kmod knint knot kzext \
3449 lbound leadz len len_trim lenlge lge lgt lle llt log log10 logical lshift malloc matmul \
3450 max max0 max1 maxexponent maxloc maxval merge min min0 min1 minexponent minloc \
3451 minval mod modulo mvbits nearest nint not nworkers number_of_processors pack popcnt \
3452 poppar precision present product radix random random_number random_seed range real \
3453 repeat reshape rrspacing rshift scale scan secnds selected_int_kind \
3454 selected_real_kind set_exponent shape sign sin sind sinh size sizeof sngl snglq spacing \
3455 spread sqrt sum system_clock tan tand tanh tiny transfer transpose trim ubound unpack verify
3457 # keywords3 are nonstardard, extended and user defined functions
3458 keywords3.$(file.patterns.fortran)=cdabs cdcos cdexp cdlog cdsin cdsqrt cotan cotand \
3459 dcmplx dconjg dcotan dcotand decode dimag dll_export dll_import doublecomplex dreal \
3460 dvchk encode find flen flush getarg getcharqq getcl getdat getenv gettim hfix ibchng \
3461 identifier imag int1 int2 int4 intc intrup invalop iostat_msg isha ishc ishl jfix \
3462 lacfar locking locnear map nargs nbreak ndperr ndpexc offset ovefl peekcharqq precfill \
3463 prompt qabs qacos qacosd qasin qasind qatan qatand qatan2 qcmplx qconjg qcos qcosd \
3464 qcosh qdim qexp qext qextd qfloat qimag qlog qlog10 qmax1 qmin1 qmod qreal qsign qsin \
3465 qsind qsinh qsqrt qtan qtand qtanh ran rand randu rewrite segment setdat settim system \
3466 timer undfl unlock union val virtual volatile zabs zcos zexp zlog zsin zsqrt
3468 #fold.comment.fortran=1
3469 #fold.quotes.fortran=1
3471 comment.block.fortran=!~
3473 # These setting do not work very well for FORTRAN, uncoment to use it
3474 # statement.indent.$(file.patterns.fortran)=8 associate block blockdata case do enum \
3475 #       function interface module program subroutine then type where
3477 # Fortran styles
3478 # Braces are matched in all cases
3479 braces.fortran.style=0
3481 if PLAT_WIN
3482         fc77=lf95 $(FileNameExt) -c -fix
3483         fc90=lf95 $(FileNameExt) -c
3484 if PLAT_GTK
3485         fc77=f77 -c -o $(FileName).o $(FileNameExt)
3486         fc90=f90 -c -o $(FileName).o $(FileNameExt)
3488 command.compile.*.f=$(fc77)
3489 command.build.*.f=make
3490 command.go.*.f=$(FileName)
3492 command.compile.*.for=$(fc77)
3493 command.build.*.for=make
3494 command.go.*.for=$(FileName)
3496 command.compile.*.f90=$(fc90)
3497 command.build.*.f90=make
3498 command.go.*.f90=$(FileName)
3500 command.compile.*.f95=$(fc90)
3501 command.build.*.f95=make
3502 command.go.*.f95=$(FileName)
3504 if PLAT_WIN
3505     api.$(file.patterns.fortran)=$(SciteDefaultHome)\fortran.api
3507 autocomplete.fortran.ignorecase=1
3508 autocomplete.f77.ignorecase=1
3509 calltip.fortran.ignorecase=1
3510 calltip.f77.ignorecase=1
3514 ###############################################################################
3515 # From freebasic.properties
3516 # Define SciTE settings for FreeBasic files.
3518 file.patterns.freebasic=*.bas;*.bi
3520 filter.freebasic=FreeBasic (bb bi)|$(file.patterns.freebasic)|
3522 *filter.freebasic=$(filter.freebasic)
3524 lexer.$(file.patterns.freebasic)=freebasic
3526 *language.freebasic=FreeBasic|bas||
3528 # keywords must be all lowercase
3530 keywordclass.freebasic=\
3531 append as asc asin asm atan2 atn beep bin binary bit bitreset bitset bload \
3532 bsave byref byte byval call callocate case cbyte cdbl cdecl chain chdir chr \
3533 cint circle clear clng clngint close cls color command common cons const \
3534 continue cos cshort csign csng csrlin cubyte cuint culngint cunsg curdir \
3535 cushort custom cvd cvi cvl cvlongint cvs cvshort data date deallocate declare \
3536 defbyte defdbl defined defint deflng deflngint defshort defsng defstr defubyte \
3537 defuint defulngint defushort dim dir do double draw dylibload dylibsymbol else \
3538 elseif end enum environ environ$ eof eqv erase err error exec exepath exit exp \
3539 export extern field fix flip for fre freefile function get getjoystick getkey \
3540 getmouse gosub goto hex hibyte hiword if iif imagecreate imagedestroy imp \
3541 inkey inp input instr int integer is kill lbound lcase left len let lib line \
3542 lobyte loc local locate lock lof log long longint loop loword lset ltrim \
3543 mid mkd mkdir mki mkl mklongint mks mkshort mod multikey mutexcreate \
3544 mutexdestroy mutexlock mutexunlock name next not oct on once open option or out \
3545 output overload paint palette pascal pcopy peek peeki peeks pipe pmap point \
3546 pointer poke pokei pokes pos preserve preset print private procptr pset ptr \
3547 public put random randomize read reallocate redim rem reset restore resume \
3548 resume next return rgb rgba right rmdir rnd rset rtrim run sadd screen \
3549 screencopy screeninfo screenlock screenptr screenres screenset screensync \
3550 screenunlock seek statement seek function selectcase setdate setenviron \
3551 setmouse settime sgn shared shell shl short shr sin single sizeof sleep space \
3552 spc sqr static stdcall step stop str string string strptr sub swap system tab \
3553 tan then threadcreate threadwait time time timer to trans trim type ubound \
3554 ubyte ucase uinteger ulongint union unlock unsigned until ushort using va_arg \
3555 va_first va_next val val64 valint varptr view viewprint wait wend while width \
3556 window windowtitle with write xor zstring
3558 keywordclass.preprocessor=\
3559 #define #dynamic #else #endif #error #if #ifdef #ifndef #inclib #include \
3560 #print #static #undef
3562 keywords.$(file.patterns.freebasic)=$(keywordclass.freebasic)
3563 keywords2.$(file.patterns.freebasic)=$(keywordclass.preprocessor)
3565 # FB styles
3566 # Date
3567 # StringEOL
3568 # Constant
3569 # Asm
3574 ###############################################################################
3575 # From gap.properties
3576 # Define SciTE settings for GAP files.
3578 file.patterns.gap=*.g;*.gd;*.gi
3580 # GAP files
3581 filter.gap=Gap (g gi gd)|$(file.patterns.gap)|
3583 *filter.gap=$(filter.gap)
3585 lexer.$(file.patterns.gap)=gap
3587 *language.gap=Gap|g||
3589 keywords.$(file.patterns.gap)=and break continue do elif else end fi for function \
3590 if in local mod not od or quit rec repeat return then until while QUIT
3592 keywords2.$(file.patterns.gap)=false true IsBound Unbind TryNextMethod \
3593 Info Assert SaveWorkspace fail
3595 #keywords3.$(file.patterns.gap)
3597 comment.block.gap=#~
3599 # GAP styles
3601 # Braces are only matched in operator style
3602 braces.gap.style=8
3605 ###############################################################################
3606 # From haskell.properties
3607 # Define SciTE settings for Haskell.
3609 lexer.*.hs=haskell
3610 filter.hs=Haskell (hs)|*.hs|
3612 *filter.hs=$(filter.hs)
3614 *language.haskell=Haskell|hs||
3617 # Available in literatehaskell lexer:
3619 # keywords for Haskell 98
3620 keywordclass.haskell98=case class data default deriving do else hiding if \
3621 import in infix infixl infixr instance let module \
3622 newtype of then type where forall foreign
3624 # keywords for FFI
3625 keywordclass.ffi=export label dynamic safe threadsafe \
3626 unsafe stdcall ccall prim
3628 keywords.*.hs=$(keywordclass.haskell98)
3630 keywords2.*.hs=$(keywordclass.ffi)
3634 ###############################################################################
3635 # From hex.properties
3636 # Define SciTE settings for Motorola S-Record and Intel HEX files.
3638 file.patterns.srec=*.mot;*.srec
3639 file.patterns.ihex=*.hex
3640 file.patterns.tehex=*.tek
3642 filter.srec=S-Record (mot)|$(file.patterns.srec)|
3643 filter.ihex=Intel HEX (hex)|$(file.patterns.ihex)|
3644 filter.tehex=Tektronix extended HEX (tek)|$(file.patterns.tehex)|
3646 *filter.srec=$(filter.srec)
3647 *filter.ihex=$(filter.ihex)
3648 *filter.tehex=$(filter.tehex)
3650 lexer.$(file.patterns.srec)=srec
3651 lexer.$(file.patterns.ihex)=ihex
3652 lexer.$(file.patterns.tehex)=tehex
3654 *language.srecord=S-Record|mot||
3655 *language.intelhex=Intel HEX|hex||
3656 *language.tektronixhex=Tektronix extended HEX|tek||
3658 # .11 N/A
3660 # .8 N/A
3662 # .14 N/A
3666 ###############################################################################
3667 # From html.properties
3668 # Define SciTE settings for HTML files.
3670 # vxml added by lseredi
3672 file.patterns.web=*.html;*.htm;*.asp;*.shtml;*.htd;*.jsp;*.xhtml
3673 file.patterns.php=*.php3;*.phtml;*.php
3674 file.patterns.html=$(file.patterns.web);$(file.patterns.php);*.htt;*.cfm;*.tpl;*.dtd;*.hta
3675 file.patterns.vxml=*.vxml
3676 file.patterns.xml=*.xml;*.xsl;*.svg;*.xul;*.xsd;*.dtd;*.xslt;*.axl;*.xrc;*.rdf
3677 file.patterns.docbook=*.docbook
3678 file.patterns.mako=*.mak;*.mako
3680 *source.patterns.cgi=*.cgi;
3681 *source.patterns.html=$(file.patterns.web);
3682 *source.patterns.xml=$(file.patterns.xml);
3684 lexer.$(file.patterns.html)=hypertext
3685 lexer.$(file.patterns.vxml)=hypertext
3686 lexer.$(file.patterns.xml)=xml
3687 lexer.$(file.patterns.docbook)=hypertext
3688 lexer.$(file.patterns.mako)=hypertext
3690 filter.web=Web (html htm asp shtml css xml docbook jsp)|$(file.patterns.web);*.css;*.xml;*.docbook|
3691 filter.php=PHP (php php3 phtml)|$(file.patterns.php)|
3693 *filter.web=$(filter.web)
3694 *filter.php=$(filter.php)
3696 *language.html=H&ypertext|html|$(keyHTML)|
3697 *language.php=P&HP|php||
3698 *language.xml=&XML|xml|$(keyXML)|
3700 fold.html=1
3701 #fold.html.preprocessor=0
3702 #fold.hypertext.comment=1
3703 #fold.hypertext.heredoc=1
3705 #Default Language=1 for JS, 2 for VBS.
3706 #asp.default.language=2
3707 #html.tags.case.sensitive=1
3709 #lexer.html.django=1
3710 #lexer.html.mako=1
3712 #xml.auto.close.tags=1
3713 #lexer.xml.allow.scripts=0
3715 # All hypertext elements and attributes must be listed in lower case
3716 hypertext.elements=\
3717 a abbr acronym address applet area b base basefont \
3718 bdo big blockquote body br button caption center \
3719 cite code col colgroup dd del dfn dir div dl dt em \
3720 fieldset font form frame frameset h1 h2 h3 h4 h5 h6 \
3721 head hr html i iframe img input ins isindex kbd label \
3722 legend li link map menu meta noframes noscript \
3723 object ol optgroup option p param pre q s samp \
3724 script select small span strike strong style sub sup \
3725 table tbody td textarea tfoot th thead title tr tt u ul \
3726 var xml xmlns
3728 hypertext.attributes=\
3729 abbr accept-charset accept accesskey action align alink \
3730 alt archive axis background bgcolor border \
3731 cellpadding cellspacing char charoff charset checked cite \
3732 class classid clear codebase codetype color cols colspan \
3733 compact content coords \
3734 data datafld dataformatas datapagesize datasrc datetime \
3735 declare defer dir disabled enctype event \
3736 face for frame frameborder \
3737 headers height href hreflang hspace http-equiv \
3738 id ismap label lang language leftmargin link longdesc \
3739 marginwidth marginheight maxlength media method multiple \
3740 name nohref noresize noshade nowrap \
3741 object onblur onchange onclick ondblclick onfocus \
3742 onkeydown onkeypress onkeyup onload onmousedown \
3743 onmousemove onmouseover onmouseout onmouseup \
3744 onreset onselect onsubmit onunload \
3745 profile prompt readonly rel rev rows rowspan rules \
3746 scheme scope selected shape size span src standby start style \
3747 summary tabindex target text title topmargin type usemap \
3748 valign value valuetype version vlink vspace width \
3749 text password checkbox radio submit reset \
3750 file hidden image \
3751 ^data-
3753 # As defined in "HTML5 differences from HTML4" Working Draft
3754 # http://www.w3.org/TR/html5-diff/
3755 html5.elements=\
3756 address article aside audio base canvas command details datalist embed \
3757 figure figcaption footer header hgroup keygen mark menu meter nav output \
3758 progress ruby rt rp section source time video wbr
3760 html5.attributes=\
3761 async autocomplete autofocus contenteditable contextmenu draggable \
3762 form formaction formenctype formmethod formnovalidate formtarget \
3763 list manifest max min novalidate pattern placeholder \
3764 required reversed role sandbox scoped seamless sizes spellcheck srcdoc step
3766 keywordclass.hypertext=\
3767 $(hypertext.elements) $(hypertext.attributes) $(html5.elements) $(html5.attributes) public !doctype
3769 vxml.elements=\
3770 assign audio block break catch choice clear disconnect else elseif \
3771 emphasis enumerate error exit field filled form goto grammar help \
3772 if initial link log menu meta noinput nomatch object option p paragraph \
3773 param phoneme prompt property prosody record reprompt return s say-as \
3774 script sentence subdialog submit throw transfer value var voice vxml
3776 vxml.attributes=\
3777 accept age alphabet anchor application base beep bridge category charset \
3778 classid cond connecttimeout content contour count dest destexpr dtmf dtmfterm \
3779 duration enctype event eventexpr expr expritem fetchtimeout finalsilence \
3780 gender http-equiv id level maxage maxstale maxtime message messageexpr \
3781 method mime modal mode name namelist next nextitem ph pitch range rate \
3782 scope size sizeexpr skiplist slot src srcexpr sub time timeexpr timeout \
3783 transferaudio type value variant version volume xml:lang
3785 keywordclass.vxml=\
3786 $(vxml.elements) $(vxml.attributes) public !doctype
3788 # List from http://www.php.net/manual/en/reserved.php (updated for PHP 5)
3789 # For a list with functions http://groups.google.com/group/scite-interest/web/extras
3790 # All words should be lower case to ensure case insensitivity when comparing
3791 keywordclass.php=\
3792 and array as bool boolean break case cfunction class const continue declare \
3793 default die directory do double echo else elseif empty enddeclare endfor \
3794 endforeach endif endswitch endwhile eval exit extends false float for \
3795 foreach function global goto if include include_once int integer isset list namespace \
3796 new null object old_function or parent print real require require_once resource \
3797 return static stdclass string switch true unset use var while xor \
3798 abstract catch clone exception final implements interface php_user_filter \
3799 private protected public this throw try \
3800 __class__ __dir__ __file__ __function__ __line__ __method__ \
3801 __namespace__ __sleep __wakeup
3803 # Override keywordclass.php with another file if present
3804 import phpfunctions
3806 keywords.$(file.patterns.html)=$(keywordclass.hypertext)
3807 # JavaScript keywords are possible inside embedded Javascript
3808 keywords2.$(file.patterns.html)=$(keywordclass.javascript)
3809 # VBScript keywords are possible inside embedded VBScript
3810 keywords3.$(file.patterns.html)=$(keywordclass.vb)
3811 # Python keywords are possible inside embedded Python
3812 keywords4.$(file.patterns.html)=$(keywordclass.python)
3813 # PHP keywords are possible inside embedded PHP
3814 keywords5.$(file.patterns.html)=$(keywordclass.php)
3815 # SGML / DTD keywords
3816 keywords6.$(file.patterns.html)=ELEMENT DOCTYPE ATTLIST ENTITY NOTATION
3818 # START DocBook
3819 docbook.elements42=\
3820 abbrev abstract accel ackno acronym action address affiliation alt anchor \
3821 answer appendix appendixinfo application area areaset areaspec arg article \
3822 articleinfo artpagenums attribution audiodata audioobject author authorblurb \
3823 authorgroup authorinitials beginpage bibliocoverage bibliodiv biblioentry \
3824 bibliography bibliographyinfo biblioid bibliomisc bibliomixed bibliomset \
3825 bibliorelation biblioset bibliosource blockinfo blockquote book bookinfo \
3826 bridgehead callout calloutlist caption caution chapter chapterinfo citation \
3827 citebiblioid citerefentry citetitle city classname classsynopsis classsynopsisinfo \
3828 cmdsynopsis co collab collabname colophon colspec command computeroutput \
3829 confdates confgroup confnum confsponsor conftitle constant constraint \
3830 constraintdef constructorsynopsis contractnum contractsponsor contrib \
3831 copyright coref corpauthor corpname country database date dedication \
3832 destructorsynopsis edition editor email emphasis entry entrytbl envar \
3833 epigraph equation errorcode errorname errortext errortype example \
3834 exceptionname fax fieldsynopsis figure filename firstname firstterm \
3835 footnote footnoteref foreignphrase formalpara funcdef funcparams \
3836 funcprototype funcsynopsis funcsynopsisinfo function glossary glossaryinfo \
3837 glossdef glossdiv glossentry glosslist glosssee glossseealso glossterm \
3838 graphic graphicco group guibutton guiicon guilabel guimenu guimenuitem \
3839 guisubmenu hardware highlights holder honorific htm imagedata imageobject \
3840 imageobjectco important index indexdiv indexentry indexinfo indexterm \
3841 informalequation informalexample informalfigure informaltable initializer \
3842 inlineequation inlinegraphic inlinemediaobject interface interfacename \
3843 invpartnumber isbn issn issuenum itemizedlist itermset jobtitle keycap \
3844 keycode keycombo keysym keyword keywordset label legalnotice lhs lineage \
3845 lineannotation link listitem iteral literallayout lot lotentry manvolnum \
3846 markup medialabel mediaobject mediaobjectco member menuchoice methodname \
3847 methodparam methodsynopsis mm modespec modifier ousebutton msg msgaud \
3848 msgentry msgexplan msginfo msglevel msgmain msgorig msgrel msgset msgsub \
3849 msgtext nonterminal note objectinfo olink ooclass ooexception oointerface \
3850 option optional orderedlist orgdiv orgname otheraddr othercredit othername \
3851 pagenums para paramdef parameter part partinfo partintro personblurb \
3852 personname phone phrase pob postcode preface prefaceinfo primary primaryie \
3853 printhistory procedure production productionrecap productionset productname \
3854 productnumber programlisting programlistingco prompt property pubdate publisher \
3855 publishername pubsnumber qandadiv qandaentry qandaset question quote refclass \
3856 refdescriptor refentry refentryinfo refentrytitle reference referenceinfo \
3857 refmeta refmiscinfo refname refnamediv refpurpose refsect1 refsect1info refsect2 \
3858 refsect2info refsect3 refsect3info refsection refsectioninfo refsynopsisdiv \
3859 refsynopsisdivinfo releaseinfo remark replaceable returnvalue revdescription \
3860 revhistory revision revnumber revremark rhs row sbr screen screenco screeninfo \
3861 screenshot secondary secondaryie sect1 sect1info sect2 sect2info sect3 sect3info \
3862 sect4 sect4info sect5 sect5info section sectioninfo see seealso seealsoie \
3863 seeie seg seglistitem segmentedlist segtitle seriesvolnums set setindex \
3864 setindexinfo setinfo sgmltag shortaffil shortcut sidebar sidebarinfo simpara \
3865 simplelist simplemsgentry simplesect spanspec state step street structfield \
3866 structname subject subjectset subjectterm subscript substeps subtitle \
3867 superscript surname sv symbol synopfragment synopfragmentref synopsis \
3868 systemitem table tbody term tertiary tertiaryie textdata textobject tfoot \
3869 tgroup thead tip title titleabbrev toc tocback tocchap tocentry tocfront \
3870 toclevel1 toclevel2 toclevel3 toclevel4 toclevel5 tocpart token trademark \
3871 type ulink userinput varargs variablelist varlistentry varname videodata \
3872 videoobject void volumenum warning wordasword xref year
3874 docbook.attributes=\
3875 arch condition conformance id lang os remap role revision revisionflag security \
3876 userlevel vendor xreflabel \
3877 status label endterm linkend space width
3879 keywordclass.docbook=\
3880 $(docbook.elements42) $(docbook.attributes)
3882 keywordclass.mako=$(keywordclass.hypertext)
3883 keywords.$(file.patterns.mako)=$(keywordclass.hypertext)
3884 # JavaScript keywords are possible inside embedded Javascript
3885 keywords2.$(file.patterns.mako)=$(keywordclass.javascript)
3886 # VBScript keywords are possible inside embedded VBScript
3887 keywords3.$(file.patterns.mako)=$(keywordclass.vb)
3888 # Python keywords are possible inside embedded Python
3889 keywords4.$(file.patterns.mako)=$(keywordclass.python) include namespace inherit \
3890 call doc text page endclass endexcept endfinally endfor endif endtry endwhile block
3891 # PHP keywords are possible inside embedded PHP
3892 keywords5.$(file.patterns.mako)=$(keywordclass.php)
3893 # SGML / DTD keywords
3894 keywords6.$(file.patterns.mako)=ELEMENT DOCTYPE ATTLIST ENTITY NOTATION
3896 # For Django's template language. Since Django seems to use the same .html extension
3897 # as plain HTML, it is up to the user to integrate these keywords if desired.
3898 keywordclass.django= not in autoescape with \
3899 csrf_token cycle empty block endblock filter endfilter for endfor firstof \
3900 if endif ifchanged endifchanged ifequal endifequal include load now regroup spaceless \
3901 endspaceless ssi url widthratio add addslashes capfirst center cut date \
3902 default default_if_none dictsort dictsortreversed divisibleby escape escapejs \
3903 filesizeformat first fix_ampersands float_format force_escape get_digit \
3904 iriencode join last length length_is linebreaks linebreaksbr linenumbers ljust \
3905 lower make_list phone2numeric pluralize pprint random removetags rjust safe \
3906 safeseq slice slugify stringformat striptags time timesince timeuntil title \
3907 truncatewords truncatewords_html unordered_list upper urlencode urlize \
3908 urlizetrunc wordcount wordwrap yesno apnumber intcomma intword ordinal \
3909 naturalday lorem
3911 keywords.$(file.patterns.docbook)=$(keywordclass.docbook)
3912 keywords6.$(file.patterns.docbook)=ELEMENT DOCTYPE ATTLIST ENTITY NOTATION
3913 # END DocBook
3915 word.characters.$(file.patterns.html)=$(chars.alpha)$(chars.numeric)$(chars.accented)_-$
3916 comment.stream.start.hypertext=<!--
3917 comment.stream.end.hypertext=-->
3918 comment.block.hypertext=//~
3919 comment.block.at.line.start.hypertext=1
3921 comment.box.start.xml=
3922 comment.stream.start.xml=
3924 # No keyword for xml, as it accepts any keyword
3925 keywords.$(file.patterns.xml)=
3926 # SGML / DTD keywords
3927 keywords6.$(file.patterns.xml)=ELEMENT DOCTYPE ATTLIST ENTITY NOTATION
3929 word.characters.$(file.patterns.xml)=$(chars.alpha)$(chars.numeric)_-
3931 keywords.$(file.patterns.vxml)=$(keywordclass.vxml)
3932 keywords2.$(file.patterns.vxml)=$(keywordclass.javascript)
3936 word.characters.$(file.patterns.vxml)=$(chars.alpha)$(chars.numeric)_-
3938 # Define the background colours for SGML and each scripting language
3939 colour.hypertext.sgml.back=back:#EFEFFF
3940 colour.hypertext.server.javascript.back=back:#DFDF7F
3941 colour.hypertext.client.vbs.back=back:#EFEFFF
3942 colour.hypertext.server.vbs.back=back:#CFCFEF
3943 colour.hypertext.client.python.back=back:#EFFFEF
3944 colour.hypertext.server.python.back=back:#CFEFCF
3945 colour.hypertext.server.php.back=back:#FFF8F8
3947 # HTML and XML share lexing code so use the same style numbers
3948 # Hypertext Markup Language
3950 # Some reasonable background colours found in the default Windows palette
3951 # Off White #FFFBF0    Light green #C0DCC0    Light Blue #A6CAF0
3953 # Embedded Javascript
3954 fontcolour.js=$(colour.embedded.js),$(font.js)
3956 # ASP Javascript
3958 # Embedded VBS
3960 # ASP VBS
3965 # PHP
3967 # XML: eXtensible Markup Language
3968 # For XML, there is no list of known tags or attributes so all are coloured known
3970 # No brace matching in XML
3971 braces.xml.style=31
3973 if PLAT_WIN
3974         command.go.$(file.patterns.web)="file://$(FilePath)"
3975         command.go.subsystem.$(file.patterns.web)=2
3976 if PLAT_GTK
3977         command.go.$(file.patterns.web)=firefox "file://$(FilePath)"
3978 if PLAT_MAC
3979         command.go.$(file.patterns.web)=open "file://$(FilePath)"
3980         command.go.subsystem.$(file.patterns.web)=2
3982 command.go.$(file.patterns.php)=php -f "$(FileNameExt)"
3983 command.compile.$(file.patterns.php)=php -l "$(FileNameExt)"
3987 ###############################################################################
3988 # From inno.properties
3989 # Define SciTE settings for Inno Setup script files.
3991 file.patterns.inno=*.iss;*.isl
3993 filter.inno=Inno Setup (iss isl)|$(file.patterns.inno)|
3995 *filter.inno=$(filter.inno)
3997 lexer.$(file.patterns.inno)=inno
3999 *language.innosetup=&InnoSetup|iss||
4001 comment.block.inno=;~
4003 # Sections
4004 keywords.$(file.patterns.inno)=\
4005  code components custommessages dirs files icons ini installdelete \
4006  langoptions languages messages registry run setup types tasks \
4007  uninstalldelete uninstallrun _istool
4009 # Keywords
4010 keywords2.$(file.patterns.inno)=\
4011  allowcancelduringinstall allownoicons allowrootdirectory allowuncpath \
4012  alwaysrestart alwaysshowcomponentslist alwaysshowdironreadypage \
4013  alwaysshowgrouponreadypage alwaysusepersonalgroup appcomments appcontact \
4014  appcopyright appid appmodifypath appmutex appname apppublisher \
4015  apppublisherurl appreadmefile appsupportphone appsupporturl appupdatesurl \
4016  appvername appversion appenddefaultdirname appenddefaultgroupname \
4017  architecturesallowed architecturesinstallin64bitmode backcolor backcolor2 \
4018  backcolordirection backsolid changesassociations changesenvironment \
4019  compression compressionthreads copyrightfontname copyrightfontsize \
4020  createappdir createuninstallregkey defaultdirname defaultgroupname \
4021  defaultuserinfoname defaultuserinfoorg defaultuserinfoserial dialogfontname \
4022  dialogfontsize dialogfontstandardheight direxistswarning disabledirpage \
4023  disablefinishedpage disableprogramgrouppage disablereadymemo \
4024  disablereadypage disablestartupprompt diskclustersize diskslicesize \
4025  diskspanning dontmergeduplicatefiles enabledirdoesntexistwarning encryption \
4026  extradiskspacerequired flatcomponentslist infoafterfile infobeforefile \
4027  internalcompresslevel languagecodepage languagedetectionmethod languageid \
4028  languagename licensefile mergeduplicatefiles messagesfile minversion \
4029  onlybelowversion outputbasefilename outputdir outputmanifestfile password \
4030  privilegesrequired reservebytes restartifneededbyrun righttoleft \
4031  setupiconfile setuplogging showcomponentsizes showlanguagedialog \
4032  showtaskstreelines showundisplayablelanguages signtool signeduninstaller \
4033  signeduninstallerdir slicesperdisk solidcompression sourcedir \
4034  terminalservicesaware timestamprounding timestampsinutc titlefontname \
4035  titlefontsize touchdate touchtime uninstalldisplayicon uninstalldisplayname \
4036  uninstallfilesdir uninstalliconfile uninstalllogmode \
4037  uninstallrestartcomputer uninstallstyle uninstallable \
4038  updateuninstalllogappname usepreviousappdir usepreviousgroup \
4039  useprevioussetuptype useprevioustasks useprevioususerinfo usesetupldr \
4040  userinfopage versioninfocompany versioninfocopyright versioninfodescription \
4041  versioninfoproductname versioninfoproductversion versioninfotextversion \
4042  versioninfoversion welcomefontname welcomefontsize windowresizable \
4043  windowshowcaption windowstartmaximized windowvisible wizardimagebackcolor \
4044  wizardimagefile wizardimagestretch wizardsmallimagebackcolor \
4045  wizardsmallimagefile wizardstyle
4047 # Parameters
4048 keywords3.$(file.patterns.inno)=\
4049  afterinstall attribs beforeinstall check comment components copymode \
4050  description destdir destname excludes externalsize extradiskspacerequired \
4051  filename flags fontinstall groupdescription hotkey iconfilename iconindex \
4052  key languages minversion name onlybelowversion parameters permissions root \
4053  runonceid section source statusmsg string subkey tasks type types valuedata \
4054  valuename valuetype verb workingdir
4056 # Preprocessor directives
4057 keywords4.$(file.patterns.inno)=\
4058  append define dim elif else emit endif endsub error expr file for if ifdef \
4059  ifexist ifndef ifnexist include insert pragma sub undef
4061 # Pascal keywords
4062 keywords5.$(file.patterns.inno)=\
4063  begin break case const continue do downto else end except finally for \
4064  function if of procedure repeat then to try until uses var while with
4066 # User defined keywords
4067 keywords6.$(file.patterns.inno)=
4069 # Properties styles
4072 #if PLAT_WIN
4073 #       # Replace PATH_TO_INNOSETUP by the path to your InnoSetup installation
4074 #       command.compile.$(file.patterns.inno)="PATH_TO_INNOSETUP\iscc.exe" $(FileNameExt)
4075 #       command.go.$(file.patterns.inno)="PATH_TO_INNOSETUP\Compil32.exe" $(FileNameExt)
4079 ###############################################################################
4080 # From json.properties
4081 # Define SciTE settings for JSON files.
4083 file.patterns.json=*.json;*.eslintrc;*.jshintrc;*.jsonld
4084 *source.patterns.json=$(file.patterns.json);
4086 filter.json=JSON (json eshintrc jshintrc)|$(file.patterns.json)|
4087 *filter.json=$(filter.json)
4089 lexer.$(file.patterns.json)=json
4091 *language.json=JSON|json||
4093 lexer.json.allow.comments=1
4094 lexer.json.escape.sequence=1
4096 # JSON keywords
4097 keywords.$(file.patterns.json)=false true null
4099 # JSON-LD keywords
4100 keywords2.$(file.patterns.json)=@id @context @type @value @language @container \
4101 @list @set @reverse @index @base @vocab @graph
4106 ###############################################################################
4107 # From kix.properties
4108 # Define SciTE settings for Assembler files
4109 # Black Horus blackhorus@gmx.net
4111 # Masm files
4112 file.patterns.kix=*.kix
4113 filter.kix=Kix-Script (kix)|$(file.patterns.kix)|
4115 *filter.kix=$(filter.kix)
4117 #lexer.$(file.patterns.kix)=asm
4118 lexer.$(file.patterns.kix)=kix
4120 *language.kix=&Kix|kix||
4122 # These keywords are commands
4123 keywords.$(file.patterns.kix)=? and beep big break call cd cls color cookie1 copy \
4124         debug del dim display do until exit flushkb for each next function endfunction \
4125         get gets global go gosub goto if else endif md or password play quit \
4126         rd redim return run select case endselect set setl setm settime \
4127         shell sleep small use while loop
4129 # This keywords are functions
4130 keywords2.$(file.patterns.kix)=abs addkey addprinterconnection addprogramgroup \
4131         addprogramitem asc ascan at backupeventlog box cdbl chr cint cleareventlog \
4132         close comparefiletimes createobject cstr dectohex delkey delprinterconnection \
4133         delprogramgroup delprogramitem deltree delvalue dir enumgroup enumipinfo enumkey \
4134         enumlocalgroup enumvalue execute exist existkey expandenvironmentvars fix \
4135         formatnumber freefilehandle getdiskspace getfileattr getfilesize getfiletime \
4136         getfileversion getobject iif ingroup instr instrrev int isdeclared join \
4137         kbhit keyexist lcase left len loadhive loadkey logevent logoff ltrim \
4138         memorysize messagebox open readline readprofilestring readtype readvalue \
4139         redirectoutput right rnd round rtrim savekey sendkeys sendmessage setascii \
4140         setconsole setdefaultprinter setfileattr setfocus setoption setsystemstate \
4141         settitle setwallpaper showprogramgroup shutdown sidtoname split srnd substr \
4142         trim ubound ucase unloadhive val vartype vartypename writeline \
4143         writeprofilestring writevalue
4145 # This keywords are macros if preceded by @
4146 keywords3.$(file.patterns.kix)=address build color comment cpu crlf csd curdir \
4147         date day domain dos error fullname homedir homedrive homeshr hostname \
4148         inwin ipaddress0 ipaddress1 ipaddress2 ipaddress3 kix lanroot ldomain \
4149         ldrive lm logonmode longhomedir lserver maxpwage mdayno mhz monthno \
4150         month msecs pid primarygroup priv productsuite producttype pwage ras \
4151         result rserver scriptdir scriptexe scriptname serror sid site startdir \
4152         syslang ticks time userid userlang wdayno wksta wuserid ydayno year
4154 # Comments
4155 comment.block.kix=;
4156 comment.block.at.line.start.kix=1
4158 # Kix Styles
4160 # Commands
4161 command.go.*.kix=kix32 $(FileName)
4163 # Indenting
4164 tab.size.$(file.patterns.kix)=6
4165 indent.size.$(file.patterns.kix)=3
4166 use.tabs.$(file.patterns.kix)=1
4168 statement.indent.$(file.patterns.kix)=7 if else for do while function case
4172 ###############################################################################
4173 # From latex.properties
4174 # Define SciTE settings for LaTeX files.
4176 file.patterns.latex=*.tex;*.sty
4178 filter.latex=LaTeX (tex sty)|$(file.patterns.latex)|
4180 *filter.latex=$(filter.latex)
4182 lexer.$(file.patterns.latex)=latex
4184 # LaTeX styles
4186 command.compile.*.tex=latex $(FileNameExt)
4187 command.build.*.tex=dvips -f $(FileName).dvi > $(FileName).ps
4188 command.go.*.tex=dvips $(FileName).dvi
4190 command.name.0.*.tex=View
4191 command.0.*.tex=xdvi $(FileName).dvi
4192 command.name.1.*.tex=View PS
4193 command.1.*.tex=gv $(FileName).ps
4197 ###############################################################################
4198 # From lisp.properties
4199 # Define SciTE settings for lisp and Scheme files.
4201 file.patterns.lisp=*.lsp;*.lisp
4203 filter.lisp=LISP (lsp lisp)|$(file.patterns.lisp)|
4205 file.patterns.scheme=*.scm;*.smd;*.ss
4206 filter.scheme=Scheme (scm smd)|$(file.patterns.scheme)|
4208 #*filter.lisp=$(filter.lisp)
4209 #*filter.scheme=$(filter.scheme)
4211 lexer.$(file.patterns.lisp)=lisp
4212 lexer.$(file.patterns.scheme)=lisp
4214 *language.lisp=Lisp|lisp||
4216 # lisp build in functions, xlisp dialect
4217 keywords.$(file.patterns.lisp)= not defun + - * / = < > <= >= princ \
4218 eval apply funcall quote identity function complement backquote lambda set setq setf \
4219 defun defmacro gensym make symbol intern symbol name symbol value symbol plist get \
4220 getf putprop remprop hash make array aref car cdr caar cadr cdar cddr caaar caadr cadar \
4221 caddr cdaar cdadr cddar cdddr caaaar caaadr caadar caaddr cadaar cadadr caddar cadddr \
4222 cdaaar cdaadr cdadar cdaddr cddaar cddadr cdddar cddddr cons list append reverse last nth \
4223 nthcdr member assoc subst sublis nsubst  nsublis remove length list length \
4224 mapc mapcar mapl maplist mapcan mapcon rplaca rplacd nconc delete atom symbolp numberp \
4225 boundp null listp consp minusp zerop plusp evenp oddp eq eql equal cond case and or let l if prog \
4226 prog1 prog2 progn go return do dolist dotimes catch throw error cerror break \
4227 continue errset baktrace evalhook truncate float rem min max abs sin cos tan expt exp sqrt \
4228 random logand logior logxor lognot bignums logeqv lognand lognor \
4229 logorc2 logtest logbitp logcount integer length nil
4231 word.chars.lisp=$(chars.alpha)$(chars.numeric)_-<>.#+@$%^&=*!?
4232 word.characters.$(file.patterns.lisp)=$(word.chars.lisp)
4234 # Scheme functions, R5RS
4235 keywords.$(file.patterns.scheme)= + - * / = < > <= >= => \
4236 abs acos and angle append apply asin assoc assoc assq assv atan \
4237 begin boolean? \
4238 caar cadr call-with-current-continuation call/cc \
4239 call-with-input-file call-with-output-file call-with-values \
4240 car cdr \
4241 caar cadr cdar cddr \
4242 caaar caadr cadar caddr cdaar cdadr cddar cdddr \
4243 caaaar caaadr caadar caaddr cadaar cadadr caddar cadddr \
4244 cdaaar cdaadr cdadar cdaddr cddaar cddadr cdddar cddddr \
4245 case ceiling char->integer \
4246 char-alphabetic? char-ci<=? char-ci<? char-ci=? char-ci>=? char-ci>? \
4247 char-downcase char-lower-case? char-numeric? char-ready? \
4248 char-upcase char-upper-case? char-whitespace? \
4249 char<=? char<? char=? char>=? char>? char? \
4250 close-input-port close-output-port complex? cond cons cos \
4251 current-input-port current-output-port \
4252 define define-syntax delay denominator display do dynamic-wind \
4253 else eof-object? eq? equal? eqv? eval even? exact->inexact exact? \
4254 exp expt \
4255 floor for-each force \
4256 gcd \
4257 if imag-part inexact->exact inexact? input-port? integer->char integer? interaction-environment \
4258 lambda lcm length let let* let-syntax letrec letrec-syntax \
4259 list list->string list->vector list-ref list-tail list? load log \
4260 magnitude make-polar make-rectangular make-string make-vector \
4261 map max member memq memv min modulo \
4262 negative? newline not null-environment null? number->string number? numerator \
4263 odd? open-input-file open-output-file or output-port? \
4264 pair? peek-char input-port? output-port? positive? procedure? \
4265 quasiquote quote quotient \
4266 rational? rationalize read read-char real-part real? remainder reverse round \
4267 scheme-report-environment set! set-car! set-cdr! sin sqrt string \
4268 string->list string->number string->symbol string-append \
4269 string-ci<=? string-ci<? string-ci=? string-ci>=? string-ci>? \
4270 string-copy string-fill! string-length string-ref string-set! \
4271 string<=? string<? string=? string>=? string>? string? \
4272 substring symbol->string symbol? syntax-rules \
4273 transcript-off transcript-on truncate \
4274 unquote unquote-splicing \
4275 values vector vector->list vector-fill! vector-length vector-ref vector-set! vector? \
4276 with-input-from-file with-output-to-file write write-char \
4277 zero?
4279 word.chars.scheme=$(chars.alpha)$(chars.numeric)!$%&*/:<=>?^_~+-.@
4280 word.characters.$(file.patterns.scheme)=$(word.chars.scheme)
4283 comment.block.lisp=;
4284 comment.box.start.lisp=;;
4285 comment.box.middle.lisp=;;
4286 comment.box.end.lisp=;;
4289 # LISP styles
4291 # Braces are only matched in operator style
4292 braces.lisp.style=10
4294 #command.go.$(file.patterns.scheme)=c:\tools\pscheme\pscheme.exe /r $(FilePath)
4295 command.go.$(file.patterns.scheme)=c:\tools\gambit\gsi.exe -f $(FilePath)
4296 #command.go.$(file.patterns.scheme)=c:\tools\plt\mzscheme.exe -r $(FilePath)
4297 command.go.subsystem.$(file.patterns.scheme)=0
4301 ###############################################################################
4302 # From lot.properties
4303 # Define SciTE settings for lot files.
4304 file.patterns.lot=*.lot
4306 filter.lot=Lot (lot)|$(file.patterns.lot)|
4308 *filter.lot=$(filter.lot)
4310 lexer.$(file.patterns.lot)=lot
4312 *language.lot=Lot|lot||
4314 word.characters.$(file.patterns.lot)=$(chars.alpha)$(chars.numeric)
4316 # LOT FileStyles
4320 ###############################################################################
4321 # From lout.properties
4322 # Define SciTE settings for Basser Lout files.
4323 # Based on Lout 3.35 [April 2007]
4324 # * to update keywords, see or diff externs.h
4326 file.patterns.lout=*.lt
4328 filter.lout=Lout (lt)|*.lt|
4330 *filter.lout=$(filter.lout)
4332 lexer.$(file.patterns.lout)=lout
4334 *language.lout=Lout|lt||
4336 # @-prefixed keywords
4337 keywords.$(file.patterns.lout)= \
4338 @OptGall @FontDef @Family @Face @Name @Metrics @ExtraMetrics \
4339 @Mapping @Recode @Filter @FilterIn @FilterOut @FilterErr \
4340 @Common @Rump @Meld @Insert @OneOf @Next @Plus @Minus @Wide \
4341 @High @HShift @VShift @BeginHeaderComponent @EndHeaderComponent \
4342 @SetHeaderComponent @ClearHeaderComponent @OneCol @OneRow \
4343 @HMirror @VMirror @HScale @VScale @HCover @VCover @Scale \
4344 @KernShrink @HContract @VContract @HLimited @VLimited @HExpand \
4345 @VExpand @StartHVSpan @StartHSpan @StartVSpan @HSpan @VSpan \
4346 @PAdjust @HAdjust @VAdjust @Rotate @Background @IncludeGraphic \
4347 @SysIncludeGraphic @Graphic @LinkSource @LinkDest @URLLink \
4348 @PlainGraphic @Verbatim @RawVerbatim @Case @Yield @BackEnd \
4349 @Char @Font @Space @YUnit @ZUnit @Break @Underline @SetColour \
4350 @SetColor @SetUnderlineColour @SetUnderlineColor @SetTexture \
4351 @Outline @Language @CurrLang @CurrFamily @CurrFace @CurrYUnit \
4352 @CurrZUnit @LEnv @@A @@B @@C @@D @@E @LClos @@V @LUse @LEO \
4353 @Open @Use @NotRevealed @Tagged @Database @SysDatabase \
4354 @Include @SysInclude @IncludeGraphicRepeated \
4355 @SysIncludeGraphicRepeated @PrependGraphic @SysPrependGraphic \
4356 @Target @Null @PageLabel @Galley @ForceGalley @LInput @Split \
4357 @Tag @Key @Optimize @Merge @Enclose @Begin @End @Moment \
4358 @Second @Minute @Hour @Day @Month @Year @Century @WeekDay \
4359 @YearDay @DaylightSaving @SetContext @GetContext
4361 # symbols that are keywords (excluding braces)
4362 keywords2.$(file.patterns.lout)= &&& && & ^// ^/ ^|| ^| ^& // / || |
4364 # non-@-prefixed keywords
4365 keywords3.$(file.patterns.lout)= def langdef force horizontally into \
4366 extend import export precedence associativity left right body macro \
4367 named compulsory following preceding foll_or_prec now
4369 comment.block.lout=#~
4371 indent.maintain.$(file.patterns.lout)=1
4373 # Lout styles
4375 # Braces are only matched in operator style
4376 braces.lout.style=8
4378 command.compile.$(file.patterns.lout)=lout "$(FileNameExt)" > "$(FileName).ps"
4379 command.build.$(file.patterns.lout)=make
4381 if PLAT_WIN
4382         command.go.$(file.patterns.lout)=gview "$(FileName).ps"
4384 if PLAT_GTK
4385         command.go.$(file.patterns.lout)=gview32 "$(FileName).ps"
4390 ###############################################################################
4391 # From lua.properties
4392 # Define SciTE settings for Lua files.
4393 # Lua 5.x highlighting is enabled by default. For other choices,
4394 # including Lua 4 highlighting, see below.
4396 file.patterns.lua=*.lua
4398 *source.patterns.lua=$(file.patterns.lua);
4400 shbang.lua=lua
4402 filter.lua=Lua (lua)|$(file.patterns.lua)|
4404 *filter.lua=$(filter.lua)
4406 lexer.$(file.patterns.lua)=lua
4408 *language.lua=Lu&a|lua||
4410 word.chars.lua=$(chars.alpha)$(chars.numeric)$(chars.accented)_%
4411 word.characters.$(file.patterns.lua)=$(word.chars.lua)
4413 #### Lua 4.0.1
4415 # Keywords
4416 keywordclass.lua4=\
4417 and break do else elseif \
4418 end for function if in \
4419 local nil not or repeat \
4420 return then until while
4422 # Basic Functions
4423 keywordclass2.lua4=\
4424 _ALERT assert call collectgarbage copytagmethods \
4425 dofile dostring error foreach foreachi \
4426 gcinfo getglobal getn gettagmethod globals \
4427 newtag next print rawget rawset \
4428 setglobal settag settagmethod sort tag \
4429 tonumber tostring tinsert tremove type \
4430 _VERSION _ERRORMESSAGE
4432 # String Manipulation & Mathematical Functions
4433 keywordclass3.lua4=\
4434 strbyte strchar strfind strlen strlower \
4435 strrep strsub strupper format gsub \
4436 abs acos asin atan atan2 \
4437 ceil cos deg exp floor \
4438 log log10 max min mod \
4439 rad sin sqrt tan frexp \
4440 ldexp random randomseed PI
4442 # Input and Output Facilities & System Facilities
4443 keywordclass4.lua4=\
4444 openfile closefile readfrom writeto appendto \
4445 remove rename flush seek tmpname read write \
4446 clock date execute exit getenv setlocale \
4447 _INPUT _OUTPUT _STDIN _STDOUT _STDERR -- file descriptors
4449 # Debug (not enabled by default)
4450 keywordclass5.lua4=\
4451 getinfo getlocal setlocal setcallhook setlinehook
4453 #### Lua 5.0.3
4455 # Keywords
4456 keywordclass.lua50=$(keywordclass.lua4) false true
4458 # Basic Functions
4459 keywordclass2.lua5=\
4460 assert collectgarbage dofile error _G \
4461 getmetatable ipairs loadfile next pairs \
4462 pcall print rawequal rawget rawset \
4463 setmetatable tonumber tostring type _VERSION \
4464 xpcall string table math coroutine io os debug
4466 keywordclass2.lua50=$(keywordclass2.lua5) \
4467 getfenv gcinfo loadlib loadstring require \
4468 setfenv unpack _LOADED LUA_PATH _REQUIREDNAME
4470 # String, Table , Mathematical, Bitwise
4471 keywordclass3.lua5=\
4472 string.byte string.char string.dump string.find string.format \
4473 string.gsub string.len string.lower string.rep string.sub string.upper \
4474 table.concat table.insert table.remove table.sort \
4475 math.abs math.acos math.asin math.atan math.atan2 \
4476 math.ceil math.cos math.deg math.exp math.floor \
4477 math.frexp math.ldexp math.log math.max math.min \
4478 math.pi math.pow math.rad math.random math.randomseed \
4479 math.sin math.sqrt math.tan
4481 keywordclass3.lua50=$(keywordclass3.lua5) \
4482 string.gfind \
4483 table.foreach table.foreachi table.getn table.setn \
4484 math.mod math.log10
4486 # Coroutine, Input/Output, System, Package
4487 keywordclass4.lua50=\
4488 coroutine.create coroutine.resume coroutine.status coroutine.wrap coroutine.yield \
4489 io.close io.flush io.input io.lines io.open \
4490 io.output io.read io.tmpfile io.type io.write \
4491 io.stdin io.stdout io.stderr \
4492 os.clock os.date os.difftime os.execute os.exit \
4493 os.getenv os.remove os.rename os.setlocale os.time \
4494 os.tmpname
4496 # Debug (not enabled by default)
4497 keywordclass5.lua50=\
4498 debug.debug debug.gethook debug.getinfo debug.getlocal debug.getupvalue \
4499 debug.setlocal debug.setupvalue debug.sethook debug.traceback
4501 #### Lua 5.1.4
4503 # Keywords
4504 keywordclass.lua51=$(keywordclass.lua50)
4506 # Basic Functions
4507 keywordclass2.lua51=$(keywordclass2.lua5) \
4508 getfenv load loadstring select \
4509 setfenv unpack package
4511 # String, Table , Mathematical, Bitwise
4512 keywordclass3.lua51=$(keywordclass3.lua5) \
4513 string.gmatch string.match string.reverse \
4514 table.maxn \
4515 math.cosh math.fmod math.huge math.log10 math.modf \
4516 math.sinh math.tanh
4518 # Coroutine, Input/Output, System, Package
4519 keywordclass4.package=\
4520 require package.cpath package.loaded \
4521 package.loadlib package.path package.preload
4523 keywordclass4.lua51=$(keywordclass4.lua50) \
4524 coroutine.running io.popen \
4525 module package.loaders package.seeall \
4526 $(keywordclass4.package)
4528 # Debug (not enabled by default)
4529 keywordclass5.lua51=$(keywordclass5.lua50) \
4530 debug.getfenv debug.getmetatable debug.getregistry debug.setfenv debug.setmetatable
4532 #### Lua 5.2.0
4534 # Keywords
4535 keywordclass.lua52=$(keywordclass.lua50) goto
4537 # Basic Functions
4538 keywordclass2.lua52=$(keywordclass2.lua5) \
4539 load rawlen select package bit32 _ENV
4541 # String, Table , Mathematical, Bitwise
4542 keywordclass3.bit32=\
4543 bit32.arshift bit32.band bit32.bnot bit32.bor bit32.btest \
4544 bit32.bxor bit32.extract bit32.replace bit32.lrotate bit32.lshift \
4545 bit32.rrotate bit32.rshift
4547 keywordclass3.lua52=$(keywordclass3.lua5) \
4548 string.gmatch string.match string.reverse \
4549 table.pack table.unpack \
4550 math.cosh math.fmod math.huge math.modf math.sinh math.tanh \
4551 $(keywordclass3.bit32)
4553 # Coroutine, Input/Output, System, Package
4554 keywordclass4.lua52=$(keywordclass4.lua50) \
4555 coroutine.running io.popen \
4556 package.config package.searchers package.searchpath \
4557 $(keywordclass4.package)
4559 # Debug (not enabled by default)
4560 keywordclass5.lua52=$(keywordclass5.lua50) \
4561 debug.getmetatable debug.getregistry debug.setmetatable \
4562 debug.getuservalue debug.setuservalue debug.upvalueid debug.upvaluejoin
4564 #### Lua 5.3.0
4566 # Keywords
4567 keywordclass.lua53=$(keywordclass.lua50) goto
4569 # Basic Functions
4570 keywordclass2.lua53=$(keywordclass2.lua5) \
4571 load rawlen select package utf8 _ENV
4573 # String, UTF8, Table , Mathematical
4574 keywordclass3.utf8=\
4575 utf8.char utf8.charpattern utf8.codes \
4576 utf8.codepoint utf8.len utf8.offset
4578 keywordclass3.lua53=\
4579 string.byte string.char string.dump string.find string.format \
4580 string.gmatch string.gsub string.len string.lower string.match \
4581 string.pack string.packsize string.rep \
4582 string.reverse string.sub string.unpack string.upper \
4583 table.concat table.insert table.move table.pack \
4584 table.remove table.sort table.unpack \
4585 math.abs math.acos math.asin math.atan \
4586 math.ceil math.cos math.deg math.exp \
4587 math.floor math.fmod math.huge \
4588 math.log math.max math.maxinteger math.min math.mininteger \
4589 math.modf math.pi math.rad \
4590 math.random math.randomseed math.sin \
4591 math.sqrt math.tan \
4592 math.tointeger math.type math.ult \
4593 $(keywordclass3.utf8)
4595 # Coroutine, Input/Output, System, Package
4596 keywordclass4.lua53=$(keywordclass4.lua50) \
4597 coroutine.isyieldable coroutine.running io.popen \
4598 package.config package.searchers package.searchpath \
4599 $(keywordclass4.package)
4601 # Debug (not enabled by default)
4602 keywordclass5.lua53=$(keywordclass5.lua52)
4604 #### Lua 5.x
4606 # Keywords
4607 keywordclass.lua5x=$(keywordclass.lua53)
4609 # Basic Functions
4610 keywordclass2.lua5x=$(keywordclass2.lua5) \
4611 getfenv gcinfo load loadlib loadstring \
4612 require select setfenv unpack \
4613 _LOADED LUA_PATH _REQUIREDNAME \
4614 package rawlen package bit32 utf8 _ENV
4616 # String, Table , Mathematical, Bitwise
4617 keywordclass3.lua5x=$(keywordclass3.lua5) \
4618 string.gfind string.gmatch string.match string.reverse \
4619 string.pack string.packsize string.unpack \
4620 table.foreach table.foreachi table.getn table.setn \
4621 table.maxn table.pack table.unpack table.move \
4622 math.cosh math.fmod math.huge math.log10 math.modf \
4623 math.mod math.sinh math.tanh math.maxinteger math.mininteger \
4624 math.tointeger math.type math.ult \
4625 $(keywordclass3.bit32) \
4626 $(keywordclass3.utf8)
4628 # Coroutine, Input/Output, System, Package
4629 keywordclass4.lua5x=$(keywordclass4.lua50) \
4630 coroutine.isyieldable coroutine.running io.popen \
4631 module package.loaders package.seeall \
4632 package.config package.searchers package.searchpath \
4633 $(keywordclass4.package)
4635 # Debug (not enabled by default)
4636 keywordclass5.lua5x=$(keywordclass5.lua50) \
4637 debug.getfenv debug.getmetatable debug.getregistry debug.setfenv debug.setmetatable \
4638 debug.getuservalue debug.setuservalue debug.upvalueid debug.upvaluejoin
4640 # Keyword highlighting selection
4641 # Options: lua4, lua50, lua51, lua52, lua53, lua5x (default)
4642 # or enable everything like this: $(keywordclass.lua4)$(keywordclass.lua5x)
4643 keywords.$(file.patterns.lua)=$(keywordclass.lua5x)
4644 keywords2.$(file.patterns.lua)=$(keywordclass2.lua5x)
4645 keywords3.$(file.patterns.lua)=$(keywordclass3.lua5x)
4646 keywords4.$(file.patterns.lua)=$(keywordclass4.lua5x)
4648 # Add keywords5, 6, 7 & 8 for user-defined libraries
4649 #keywords5.$(file.patterns.lua)=
4650 #keywords6.$(file.patterns.lua)=
4651 #keywords7.$(file.patterns.lua)=
4652 #keywords8.$(file.patterns.lua)=
4654 #~ statement.indent.$(file.patterns.lua)=5 do else function then
4655 #~ statement.lookback.$(file.patterns.lua)=20
4656 indent.maintain.$(file.patterns.lua)=1
4658 comment.block.lua=--~
4659 comment.block.at.line.start.lua=1
4661 # Lua styles
4663 # Braces are only matched in operator style
4664 braces.lua.style=10
4666 # compatible with LuaBinaries for Lua 5.1; will work on both platforms.
4667 command.compile.*.lua=luac5.1 -o "$(FileName).luc" "$(FileNameExt)"
4668 # Lua 5.1
4669 command.go.*.lua=lua5.1 "$(FileNameExt)"
4670 # Lua 4.0
4671 #command.go.*.lua=Lua-4.0.exe -c -f "$(FileNameExt)"
4675 ###############################################################################
4676 # From matlab.properties
4677 # Define SciTE settings for Octave and Matlab (see below) files.
4679 # set the default lexer for .m files
4680 DEFAULT_M_LEXER_OCTAVE=1
4681 DEFAULT_M_LEXER_MATLAB=0
4683 #-----------------------------------------------------------------------
4684 # Octave
4685 #-----------------------------------------------------------------------
4687 # M: Octave M-Files (we nee .m.octave for distinguishing it from matlab)
4688 file.patterns.octave=*.m.octave
4689 #~ if DEFAULT_M_LEXER_OCTAVE
4690 #~ file.patterns.octave=*.m;$(file.patterns.octave)
4691 file.patterns.matlab=*.m;*.m.octave
4693 # M: Octave M-Files
4694 filter.octave=Octave (m)|$(file.patterns.octave)|
4696 lexer.$(file.patterns.octave)=octave
4698 #*language.octave=Octave|m.octave||
4700 keywordclass.octave=\
4701 __FILE__ \
4702 __LINE__ \
4703 break \
4704 case \
4705 catch \
4706 classdef \
4707 continue \
4708 do \
4709 else \
4710 elseif \
4711 end \
4712 end_try_catch \
4713 end_unwind_protect \
4714 endclassdef \
4715 endenumeration \
4716 endevents \
4717 endfor \
4718 endif \
4719 endmethods \
4720 endparfor \
4721 endproperties \
4722 endswitch \
4723 endwhile \
4724 enumeration \
4725 events \
4726 for \
4727 function endfunction \
4728 get \
4729 global \
4730 if \
4731 methods \
4732 otherwise \
4733 parfor \
4734 persistent \
4735 properties \
4736 return \
4737 set \
4738 static \
4739 switch \
4740 try \
4741 until \
4742 unwind_protect \
4743 unwind_protect_cleanup \
4744 while
4746 keywords.$(file.patterns.octave)=$(keywordclass.octave)
4748 comment.block.octave=#
4750 # Octave styles
4752 #-----------------------------------------------------------------------
4753 # Matlab
4754 #-----------------------------------------------------------------------
4756 # M: Matlab M-Files (we need .m.matlab to distinguish it from octave)
4757 file.patterns.matlab=*.m.matlab
4758 #~ if DEFAULT_M_LEXER_MATLAB
4759 #~ file.patterns.matlab=*.m;$(file.patterns.matlab)
4760 # M: Matlab M-Files
4761 filter.matlab=Matlab (m)|$(file.patterns.matlab)|
4763 *filter.matlab=$(filter.matlab)
4765 lexer.$(file.patterns.matlab)=matlab
4767 *language.matlab=Matlab|m.matlab||
4769 keywordclass.matlab=break case catch continue else elseif end for function \
4770 global if otherwise persistent return switch try while
4772 keywords.$(file.patterns.matlab)=$(keywordclass.matlab)
4774 comment.block.matlab=%~
4776 # Matlab styles
4781 ###############################################################################
4782 # From metapost.properties
4783 # file    : metapost.properties
4784 # version : 18 august 2003
4785 # author  : Hans Hagen / PRAGMA ADE / www.pragma-ade.com
4787 # Metapost: patterns
4789 file.patterns.metapost=*.mp;*.mpx
4790 file.patterns.metafun=*.mp;*.mpx;*.mpy
4792 filter.metapost=MetaPost (mp mpx)|$(file.patterns.metapost)|
4793 filter.metafun=MetaFun (mp mpx mpy)|$(file.patterns.metafun)|
4795 *filter.metapost=$(filter.metapost)
4797 lexer.$(file.patterns.metapost)=metapost
4798 lexer.$(file.patterns.metafun)=metapost
4800 *language.metapost=MetaPost|mp||
4802 # Metapost: commands (check process view)
4804 command.compile.$(file.patterns.metapost)=
4805 command.build.$(file.patterns.metapost)=mpost $(FileNameExt)
4806 command.go.$(file.patterns.metapost)=gv $(FileName).1
4808 command.compile.$(file.patterns.metafun)=
4809 command.build.$(file.patterns.metafun)=texexec --mptex $(FileNameExt)
4810 command.go.$(file.patterns.metafun)=gv $(FileName).1
4812 command.0.$(file.patterns.metapost)=
4813 command.1.$(file.patterns.metapost)=
4814 command.2.$(file.patterns.metapost)=
4815 command.3.$(file.patterns.metapost)=
4816 command.4.$(file.patterns.metapost)=
4817 command.5.$(file.patterns.metapost)=
4818 command.6.$(file.patterns.metapost)=
4819 command.7.$(file.patterns.metapost)=
4820 command.8.$(file.patterns.metapost)=
4821 command.9.$(file.patterns.metapost)=
4823 command.0.$(file.patterns.metafun)=
4824 command.1.$(file.patterns.metafun)=
4825 command.2.$(file.patterns.metafun)=
4826 command.3.$(file.patterns.metafun)=
4827 command.4.$(file.patterns.metafun)=
4828 command.5.$(file.patterns.metafun)=
4829 command.6.$(file.patterns.metafun)=
4830 command.7.$(file.patterns.metafun)=
4831 command.8.$(file.patterns.metafun)=
4832 command.9.$(file.patterns.metafun)=
4834 # Metapost: highlighting
4838 # Metapost: comments
4840 comment.block.metapost=%
4841 comment.block.at.line.start.metapost=1
4843 # Metapost: lexer.metapost.interface.default
4845 # 0 not used
4846 # 1 metapost primitives and commands
4847 # 2 metafun macros
4849 # first lines of a metapost file are interpreted as follows:
4851 # % interface=none|metapost|mp|metafun
4853 lexer.metapost.interface.default=1
4855 # Metapost: lexer.metapost.comment.process
4857 # 0 don't interpret comment
4858 # 1 color comment like source code
4860 lexer.metapost.comment.process=0
4862 # Metapost: keywords
4864 keywordclass.metapost.tex=\
4865     btex verbatimtex etex
4867 keywordclass.metapost.primitives=\
4868     charcode day linecap linejoin miterlimit month pausing \
4869     prologues showstopping time tracingcapsules tracingchoices \
4870     tracingcommands tracingequations tracinglostchars \
4871     tracingmacros tracingonline tracingoutput tracingrestores \
4872     tracingspecs tracingstats tracingtitles truecorners \
4873     warningcheck year \
4874     false nullpicture pencircle true \
4875     and angle arclength arctime ASCII bluepart boolean bot \
4876     char color cosd cycle decimal directiontime floor fontsize \
4877     greenpart hex infont intersectiontimes known length llcorner \
4878     lrcorner makepath makepen mexp mlog normaldeviate not \
4879     numeric oct odd or path pair pen penoffset picture point \
4880     postcontrol precontrol redpart reverse rotated scaled \
4881     shifted sind slanted sqrt str string subpath substring \
4882     transform transformed ulcorner uniformdeviate unknown \
4883     urcorner xpart xscaled xxpart xypart ypart yscaled yxpart \
4884     yypart zscaled \
4885     addto clip input interim let newinternal save setbounds \
4886     shipout show showdependencies showtoken showvariable \
4887     special \
4888     begingroup endgroup of curl tension and controls \
4889     reflectedabout rotatedaround interpath on off beginfig \
4890     endfig def vardef enddef epxr suffix text primary secondary \
4891     tertiary primarydef secondarydef tertiarydef top bottom \
4892     ulft urt llft lrt randomseed also contour doublepath \
4893     withcolor withpen dashed if else elseif fi for endfor forever exitif \
4894     forsuffixes downto upto step until \
4895     charlist extensible fontdimen headerbyte kern ligtable \
4896     boundarychar chardp charext charht charic charwd designsize \
4897     fontmaking charexists \
4898     cullit currenttransform gfcorners grayfont hround \
4899     imagerules lowres_fix nodisplays notransforms openit \
4900     displaying currentwindow screen_rows screen_cols \
4901     pixels_per_inch cull display openwindow numspecial \
4902     totalweight autorounding fillin proofing tracingpens \
4903     xoffset chardx granularity smoothing turningcheck yoffset \
4904     chardy hppp tracingedges vppp \
4905     extra_beginfig extra_endfig mpxbreak \
4906     end
4908 keywordclass.metapost.plain=\
4909     ahangle ahlength bboxmargin defaultpen defaultscale \
4910     labeloffset background currentpen currentpicture cuttings \
4911     defaultfont extra_beginfig extra_endfig \
4912     beveled black blue bp butt cc cm dd ditto down epsilon \
4913     evenly fullcircle green halfcircle identity in infinity left \
4914     mitered mm origin pensquare pt quartercircle red right \
4915     rounded squared unitsquare up white withdots \
4916     abs bbox ceiling center cutafter cutbefore dir \
4917     directionpoint div dotprod intersectionpoint inverse mod lft \
4918     round rt unitvector whatever \
4919     cutdraw draw drawarrow drawdblarrow fill filldraw drawdot \
4920     loggingall pickup tracingall tracingnone undraw unfill \
4921     unfilldraw \
4922     buildcycle dashpattern decr dotlabel dotlabels drawoptions \
4923     incr label labels max min thelabel z \
4924     beginchar blacker capsule_end change_width \
4925     define_blacker_pixels define_corrected_pixels \
4926     define_good_x_pixels define_good_y_pixels \
4927     define_horizontal_corrected_pixels define_pixels \
4928     define_whole_blacker_pixels define_whole_pixels \
4929     define_whole_vertical_blacker_pixels \
4930     define_whole_vertical_pixels endchar extra_beginchar \
4931     extra_endchar extra_setup font_coding_scheme\
4932     font_extra_space
4934 keywordclass.metapost.all=\
4935     $(keywordclass.metapost.tex) \
4936     $(keywordclass.metapost.primitives) \
4937     $(keywordclass.metapost.plain)
4939 keywordclass.metafun.all=
4941 keywords.$(file.patterns.metapost)=$(keywordclass.metapost.all)
4943 keywords.$(file.patterns.metafun)=$(keywordclass.metapost.all)
4944 keywords2.$(file.patterns.metafun)=$(keywordclass.metafun.all)
4946 ##  Metapost fold points
4947 ## keywords4  = fold beginning; keywords5 = fold ending.
4948 keywords4.$(file.patterns.metapost)=beginfig for verbatimtex def begingroup \
4949     if btex forsuffixes vardef primarydef
4950 keywords5.$(file.patterns.metapost)=etex fi endfig endgroup end endfor endif \
4951     enddef
4953 import metafun-scite.properties
4955 # Metapost: end of file
4959 ###############################################################################
4960 # From mmixal.properties
4962 # Define SciTE settings for MMIXAL files.
4964 file.patterns.mmixal=*.mms
4965 filter.mmixal=MMIXAL (mms)|$(file.patterns.mmixal)|
4966 *filter.mmixal=$(filter.mmixal)
4968 lexer.$(file.patterns.mmixal)=mmixal
4970 *language.mmixal=MMIXAL|mms||
4972 opcodes=2ADDU 4ADDU 8ADDU 16ADDU ADD ADDU AND ANDNH ANDNL ANDNMH ANDNML \
4973         BDIF BEV BN BNN BNP BNZ BOD BP BSPEC BYTE BZ CMP CMPU CSEV CSN CSNN CSNP CSNZ CSOD CSP CSWAP CSZ \
4974         DIV DIVU ESPEC EXPR FADD FCMP FCMPE FDIV FEQL FEQLE FIX FIXU FLOT FLOTU FMUL FREM FSQRT FSUB FUN FUNE \
4975         GET GETA GO GREG I_BIT INCH INCL INCMH INCML IS JMP LDA LDB LDBU LDHT LDO LDOU LDSF LDT LDTU LDUNC LDVTS LDW LDWU LOC LOCAL \
4976         MOR MUL MULU MUX MXOR NAND NEG NEGU NNIX NOR NXOR O_BIT OCTA ODIF OR ORH ORL ORMH ORML ORN \
4977         PBEV PBN PBNN PBNP PBNZ PBOD PBP PBZ POP PREFIX PREGO PRELD PREST PUSHGO PUSHJ PUT \
4978         RESUME SAVE SET SETH SETL SETMH SETML SFLOT SFLOTU SL SLU SR SRU \
4979         STB STBU STCO STHT STO STOU STSF STT STTU STUNC STW STWU SUB SUBU SWYM SYNC SYNCD TDIF TETRA TRAP TRIP UNSAVE \
4980         WDIF WYDEXOR ZSEV ZSN ZSNN ZSNP ZSNZ ZSOD ZSP ZSZ
4982 special_register=rA rB rC rD rE rF rG rH rI rJ rK rL rM rN rO rP rQ rR rS rT rU rV rW rX rY rZ rBB rTT rWW rXX rYY rZZ
4984 predef_symbols=@ Text_Segment Data_Segment Pool_Segment Stack_Segment \
4985         StdErr StdIn StdOut \
4986         Fopen Fclose Fread Fwrite Fgets Fputs Fgetws Fputws Ftell Fseek \
4987         TextRead TextWrite BinaryRead BinaryWrite BinaryReadWrite
4989 keywords.$(file.patterns.mmixal)=$(opcodes)
4990 keywords2.$(file.patterns.mmixal)=$(special_register)
4991 keywords3.$(file.patterns.mmixal)=$(predef_symbols)
4993 # Include for those who use the preprocessor mmixali written by R. Loos.
4994 # Comment otherwise.
4996 comment.block.mmixal=%
4998 tab.size.$(file.patterns.mmixal)=16
4999 indent.size.$(file.patterns.mmixal)=16
5001 command.compile.$(file.patterns.mmixal)=mmixal -l $(FileName).map -b 200 $(FilePath)
5002 command.go.$(file.patterns.mmixal)=mmix $(1) $(FileName).mmo
5003 #~ mmotype
5004 command.name.2.$(file.patterns.mmixal)=mmotype
5005 command.2.$(file.patterns.mmixal)=mmotype $(FileName).mmo $(FileName).out
5009 ###############################################################################
5010 # From modula3.properties
5012 #       -*- coding: utf-8 -*-
5013 #       File    :       modula3.properties
5014 #       Author  :       Dariusz KnociÅ„ski
5015 #       Date    :       2010/11/07 - 2010/12/11
5016 #       Notes   :       Define SciTE settings for Modula-3.
5019 file.patterns.m3=*.m3;*.mg;*.i3;*.ig
5021 filter.modula3=Modula-3 (m3 i3 mg ig)|$(file.patterns.m3)|
5022 *filter.modula3=$(filter.modula3)
5023 lexer.$(file.patterns.m3)=modula
5024 *language.modula3=Modula-3|m3||
5026 #       Keywords
5028 keywords.$(file.patterns.m3)=AND ANY ARRAY AS BEGIN BITS BRANDED BY CASE CONST\
5029         DIV DO ELSE ELSIF END EVAL EXCEPT EXCEPTION EXIT EXPORTS FINALLY FOR FROM\
5030         GENERIC IF IMPORT IN INTERFACE LOCK LOOP METHODS MOD MODULE NOT OBJECT OF\
5031         OR OVERRIDES PROCEDURE RAISE RAISES READONLY RECORD REF REPEAT RETURN\
5032         REVEAL ROOT SET THEN TO TRY TYPE TYPECASE UNSAFE UNTIL UNTRACED VALUE VAR\
5033         WHILE WITH
5035 #       Reserved identifiers
5037 keywords2.$(file.patterns.m3)=ABS ADDRESS ADR ADRSIZE BITSIZE BOOLEAN BYTESIZE\
5038         CARDINAL CEILING CHAR DEC DISPOSE EXTENDED FALSE FIRST FLOAT FLOOR INC\
5039         INTEGER ISTYPE LAST LONGINT LONGREAL LOOPHOLE MAX MIN MUTEX NARROW NEW NIL\
5040         NULL NUMBER ORD REAL REFANY ROUND SUBARRAY TEXT TRUE TRUNC TYPECODE VAL\
5041         WIDECHAR
5043 #       Operators
5045 keywords3.$(file.patterns.m3)= + < # = ; .. : - > { } | := <: * <= ( ) ^ , =>\
5046         / >= [ ] . &
5048 #       Pragmas keywords
5050 keywords4.$(file.patterns.m3)= EXTERNAL INLINE ASSERT TRACE FATAL UNUSED\
5051         OBSOLETE NOWARN LINE PRAGMA
5053 #       Escape sequences
5055 keywords5.$(file.patterns.m3)= f n r t \ " '
5057 #       Doxygene keywords
5059 keywords6.$(file.patterns.m3)= author authors file brief date proc param result
5061 # Default fonts
5063 font.module.base=$(font.base)
5064 font.modula.code=font:$(font.module.base),size:10
5065 font.modula.comment=font:$(font.module.base),size:10,italics
5066 font.modula.doxykey=font:$(font.module.base),size:10,bold,italics
5067 font.modula.keywords=font:$(font.module.base),size:10,bold
5068 font.modula.reserved=font:$(font.module.base),size:10
5069 font.modula.strings=font:$(font.module.base),size:10,italics
5070 font.modula.strspec=font:$(font.module.base),size:10,bold,italics
5071 font.modula.char=font:$(font.module.base),size:10,italics
5072 font.modula.charspec=font:$(font.module.base),size:10,bold,italics
5073 font.modula.badstr=font:$(font.module.base),size:10,bold
5075 # Default
5078 # Comments
5081 # Doxygen comments
5084 # Doxygene keywords
5087 # Keywords
5090 # Reserved words
5093 # Numbers
5096 # Based numbers / #{#}_#{#} base 2-16
5099 # Float numbers / #{#}.#{#}Exp
5102 # Strings
5105 # Strings special (escape sequences)
5108 # Char
5111 # Char special (escape sequences and octal numbers)
5114 # Procedures
5117 # Pragmas
5120 # Pragmas keywords
5123 # Operators
5126 # Bad strings
5130 #       EOF
5135 ###############################################################################
5136 # From nimrod.properties
5137 # Define SciTE settings for Nimrod files.
5139 file.patterns.nimrod=*.nim
5141 shbang.nimrod=nim
5143 filter.nimrod=Nimrod (nim)|$(file.patterns.nimrod)|
5145 *filter.nimrod=$(filter.nimrod)
5147 lexer.$(file.patterns.nimrod)=nimrod
5149 keywordclass.nimrod=addr and as asm \
5150 block break \
5151 case cast const continue converter \
5152 discard div \
5153 elif else end enum except exception \
5154 finally for from generic \
5155 if implies import in include is isnot iterator \
5156 lambda \
5157 macro method mod \
5158 nil not notin \
5159 object of or out \
5160 proc ptr \
5161 raise ref return \
5162 shl shr \
5163 template try tuple type \
5164 var \
5165 when where while with without \
5166 xor \
5167 yield
5169 keywords.$(file.patterns.nimrod)=$(keywordclass.nimrod)
5171 #~ statement.indent.$(file.patterns.nimrod)=10 :
5172 statement.indent.$(file.patterns.nimrod)=5 elif else except finally of \
5173 for if try while
5175 statement.lookback.$(file.patterns.nimrod)=0
5176 block.start.$(file.patterns.nimrod)=
5177 block.end.$(file.patterns.nimrod)=
5179 view.indentation.examine.*.nim=2
5181 #fold.quotes.nimrod=1
5183 comment.block.nimrod=#~
5185 # nimrod styles
5186 # Braces are only matched in operator style
5187 braces.nimrod.style=10
5189 if PLAT_WIN
5190         command.go.*.nim=nimrod c -r "$(FileNameExt)"
5191         command.go.subsystem.*.nim=1
5193 if PLAT_GTK
5194         command.go.*.nim=nimrod c -r "$(FileNameExt)"
5196 command.name.1.*.nim=Syntax Check
5197 command.1.*.nim=nimrod check "$(FilePath)"
5199 # compile
5200 command.compile.*.nim=nimrod c "$(FilePath)"
5202 # build
5203 command.build.*.nim=nimrod --forcebuild "$(FilePath)"
5204 command.build.subsystem.*.nim=1
5210 ###############################################################################
5211 # From nncrontab.properties
5212 # Define SciTE settings for extended crontab files used by a powerful
5213 # Windows scheduler/event monitor/automation manager nnCron.
5214 # (http://nemtsev.eserv.ru/)
5216 file.patterns.nncron=*.tab;*.spf
5217 # add '*.tab;*.spf;' to 'source.files' variable in 'SciTEGlobal.properties'
5218 # if you want to include these file patterns into default source file list
5220 lexer.$(file.patterns.nncron)=nncrontab
5222 *language.nnCron=&nnCron crontab|tab||
5224 filter.nncrontab=nnCron files (tab spf)|$(file.patterns.nncron)|
5226 *filter.nncrontab=$(filter.nncrontab)
5228 word.characters.$(file.patterns.nncron)=$(chars.alpha)$(chars.numeric)%-
5230 comment.block.nncrontab=\ 
5232 # nnCrontab styles
5234 # Section keywords and Forth words for nnCrontab
5235 keywords.$(file.patterns.nncron)=\
5236 AGAIN ALLOT AND Action BEGIN CASE COMPARE CONSTANT CREATE DO Days ELSE \
5237 ENDCASE ENDOF EVAL-SUBST EVALUATE FALSE Hours I IF LEAVE LOOP Minutes \
5238 Months NOT OF OFF ON OR PAD REPEAT Rule SET THEN TRUE Time UNTIL VALUE \
5239 VARIABLE WHILE WeekDays Years
5241 # Keywords for nnCrontab
5242 keywords2.$(file.patterns.nncron)=\
5243 </JScript> </SCRIPT> </VBScript> <JScript> <VBScript> ACCESS-DATE BEEP \
5244 CALL_DIAL CALL_HANGUP CHAR CLIPBOARD CONSOLE CREATION-DATE CUR-DATE DATE- \
5245 DATE-INTERVAL DELAY DIAL DIR-CREATE DIR-DELETE DIR-EMPTY DIR-SIZE Day@ \
5246 Domain ERR-MSG EXIST FILE-ACCESS-DATE FILE-APPEND FILE-COPY FILE-CREATE \
5247 FILE-CREATION-DATE FILE-CROP FILE-DATE FILE-DELETE FILE-EMPTY FILE-EXIST \
5248 FILE-MOVE FILE-RENAME FILE-SIZE FILE-WRITE FILE-WRITE-DATE FOR-CHILD-WINDOWS \
5249 FOR-FILES FOR-WINDOWS FREE-SPACE GET-CUR-TIME GET-REG GET-VER GetTickCount \
5250 HANGUP HIDE-ICON HINT HINT-OFF HINT-POS HINT-SIZE HINTW HOST-EXIST Hour@ \
5251 IDLE INTERVAL IS-ARCHIVE IS-DIR IS-HIDDEN IS-READONLY IS-SYSTEM KILL LAUNCH \
5252 LOG LOGGEDON LOGOFF LogonBatch LogonInteractive LogonNetwork MOUSE-LBCLK \
5253 MOUSE-LBDCLK MOUSE-LBDN MOUSE-LBUP MOUSE-MOVE MOUSE-MOVER MOUSE-MOVEW \
5254 MOUSE-RBCLK MOUSE-RBDCLK MOUSE-RBDN MOUSE-RBUP MSG Min@ Mon@ \
5255 MonitorResponseTime NHOST-EXIST No ONLINE PAUSE PLAY-SOUND PLAY-SOUNDW \
5256 POP3-CHECK POWEROFF PROC-EXIST PROC-TIME PURGE-OLD PURGE-OLDA PURGE-OLDW \
5257 Password QSTART-APP QSTART-APPW QUERY QUIT RASDomain RASError RASPassword \
5258 RASPhone RASSecPassword RASUser RE-ALL RE-MATCH REBOOT REG-DELETE-KEY \
5259 REG-DELETE-VALUE REG-DWORD REG-SZ REMINDER RUN SEND-KEYS SEND-KEYS-DELAY \
5260 SHOW-ICON SHUTDOWN START-APP START-APPW START-QUIT START-TIME Sec@ \
5261 SecPassword THINT THINTW TimeSec@ TMSG TQUERY User WDay@ WIN-ACTIVATE \
5262 WIN-ACTIVE WIN-CLICK WIN-CLOSE WIN-EXIST WIN-HIDE WIN-HWND WIN-MAXIMIZE \
5263 WIN-MINIMIZE WIN-MOVE WIN-MOVER WIN-RESTORE WIN-SEND-KEYS WIN-SHOW \
5264 WIN-TERMINATE WIN-TOPMOST WIN-VER WIN-WAIT WINAPI WRITE-DATE WatchClipboard \
5265 WatchConnect WatchDir WatchDisconnect WatchDriveInsert WatchDriveRemove \
5266 WatchFile WatchProc WatchProcStop WatchWinActivate WatchWinCreate \
5267 WatchWinDestroy WatchWindow WinNT Year@ Yes
5269 # Modifiers for nnCrontab
5270 keywords3.$(file.patterns.nncron)=\
5271 ALL AboveNormalPriority AsService BelowNormalPriority FILESONLY \
5272 HighPriority IdlePriority LoadProfile NoActive NoDel NoLog NoRunAs \
5273 NormalPriority OnceADay OnceAHour OnceAMonth OnceAWeek RECURSIVE \
5274 RealtimePriority RunOnce SWHide ShowMaximized ShowMinimized ShowNoActivate \
5275 ShowNormal StartIn StartPos StartSize TODEPTH WATCH-CHANGE-ATTRIBUTES \
5276 WATCH-CHANGE-DIR-NAME WATCH-CHANGE-FILE-NAME WATCH-CHANGE-LAST-WRITE \
5277 WATCH-CHANGE-SECURITY WATCH-CHANGE-SIZE WaitFor WatchSubtree WithoutProfile
5282 ###############################################################################
5283 # From nsis.properties
5284 # Define SciTE settings for NSIS.
5285 # contributed by Angelo Mandato <angelo at spaceblue dot com>
5286 # Updated for NSIS v.2.02 / 2004-10-25 by flizebogen <flizebogen at gmx dot de>
5287 # Updated /2004-28-2 by Robert Roessler <robertr at rftp dot com>
5288 # Updated for NSIS v.2.05 and latest lexer / 2005-3-10 by Angelo Mandato <angelo at spaceblue dot com>
5290 filter.nsis=NSIS (nsi nsh)|*.nsi;*.nsh|
5291 *filter.nsis=$(filter.nsis)
5292 file.patterns.nsis=*.nsi;*.nsh
5293 lexer.$(file.patterns.nsis)=nsis
5294 *language.nsis=NSIS|nsis||
5296 # Advanced settings
5297 nsis.uservars=1
5298 #nsis.ignorecase=1
5299 # Note: keywords below must all be lowercase in order for ignorecase=1 to function correctly
5301 # Functions:
5302 keywords.$(file.patterns.nsis)=!addincludedir !addplugindir MakeNSIS Portions \
5303 Contributors: Abort AddBrandingImage AddSize AutoCloseWindow BGFont \
5304 BGGradient BrandingText BringToFront Call CallInstDLL Caption ChangeUI \
5305 ClearErrors ComponentText GetDLLVersion GetDLLVersionLocal GetFileTime \
5306 GetFileTimeLocal CopyFiles CRCCheck CreateDirectory CreateFont CreateShortCut \
5307 SetDatablockOptimize DeleteINISec DeleteINIStr DeleteRegKey DeleteRegValue \
5308 Delete DetailPrint DirText DirShow DirVar DirVerify GetInstDirError AllowRootDirInstall \
5309 CheckBitmap EnableWindow EnumRegKey EnumRegValue Exch Exec ExecWait \
5310 ExecShell ExpandEnvStrings FindWindow FindClose FindFirst FindNext File FileBufSize \
5311 FlushINI ReserveFile FileClose FileErrorText FileOpen FileRead FileWrite FileReadByte \
5312 FileWriteByte FileSeek Function FunctionEnd GetDlgItem GetFullPathName \
5313 GetTempFileName HideWindow Icon IfAbort IfErrors IfFileExists IfRebootFlag IfSilent \
5314 InstallDirRegKey InstallColors InstallDir InstProgressFlags InstType IntOp IntCmp \
5315 IntCmpU IntFmt IsWindow Goto LangString LangStringUP LicenseData \
5316 LicenseForceSelection LicenseLangString LicenseText LicenseBkColor \
5317 LoadLanguageFile LogSet LogText MessageBox Nop Name OutFile Page \
5318 PageCallbacks PageEx PageExEnd Pop Push Quit ReadINIStr ReadRegDWORD \
5319 ReadRegStr ReadEnvStr Reboot RegDLL Rename Return RMDir Section SectionEnd \
5320 SectionIn SubSection SectionGroup SubSectionEnd SectionGroupEnd SearchPath \
5321 SectionSetFlags SectionGetFlags SectionSetInstTypes SectionGetInstTypes \
5322 SectionGetText SectionSetText SectionGetSize SectionSetSize GetCurInstType \
5323 SetCurInstType InstTypeSetText InstTypeGetText SendMessage SetAutoClose \
5324 SetCtlColors SetBrandingImage SetCompress SetCompressor SetCompressorDictSize \
5325 SetCompressionLevel SetDateSave SetDetailsView SetDetailsPrint SetErrors \
5326 SetErrorLevel GetErrorLevel SetFileAttributes SetFont SetOutPath SetOverwrite \
5327 SetPluginUnload SetRebootFlag SetShellVarContext SetSilent ShowInstDetails \
5328 ShowUninstDetails ShowWindow SilentInstall SilentUnInstall Sleep StrCmp StrCpy \
5329 StrLen SubCaption UninstallExeName UninstallCaption UninstallIcon UninstPage \
5330 UninstallText UninstallSubCaption UnRegDLL WindowIcon WriteINIStr WriteRegBin \
5331 WriteRegDWORD WriteRegStr WriteRegExpandStr WriteUninstaller XPStyle !packhdr \
5332 !system !execute !AddIncludeDir !include !cd !ifdef !ifndef !endif !define !undef !else !echo !warning \
5333 !error !verbose !macro !macroend !insertmacro !ifmacrodef !ifmacrondef MiscButtonText \
5334 DetailsButtonText UninstallButtonText InstallButtonText SpaceTexts \
5335 CompletedText GetFunctionAddress GetLabelAddress GetCurrentAddress \
5336 !AddPluginDir InitPluginsDir AllowSkipFiles Var VIAddVersionKey VIProductVersion LockWindow
5339 # Variables:
5340 keywords2.$(file.patterns.nsis)=$0 $1 $2 $3 $4 $5 $6 $7 $8 $9 \
5341 $R0 $R1 $R2 $R3 $R4 $R5 $R6 $R7 $R8 $R9 $\t $\" $\' $\` \
5342 $VARNAME $0, $INSTDIR $OUTDIR $CMDLINE $LANGUAGE $PROGRAMFILES \
5343 $COMMONFILES $DESKTOP $EXEDIR ${NSISDIR} $WINDIR $SYSDIR $TEMP \
5344 $STARTMENU $SMPROGRAMS $SMSTARTUP $QUICKLAUNCH $DOCUMENTS \
5345 $SENDTO $RECENT $FAVORITES $MUSIC $PICTURES $VIDEOS $NETHOOD \
5346 $FONTS $TEMPLATES $APPDATA $PRINTHOOD $INTERNET_CACHE $COOKIES \
5347 $HISTORY $PROFILE $ADMINTOOLS $RESOURCES $RESOURCES_LOCALIZED \
5348 $CDBURN_AREA $HWNDPARENT $PLUGINSDIR $$ $\r $\n
5350 # Labels:
5351 keywords3.$(file.patterns.nsis)=ARCHIVE FILE_ATTRIBUTE_ARCHIVE FILE_ATTRIBUTE_HIDDEN \
5352 FILE_ATTRIBUTE_NORMAL FILE_ATTRIBUTE_OFFLINE FILE_ATTRIBUTE_READONLY \
5353 FILE_ATTRIBUTE_SYSTEM FILE_ATTRIBUTE_TEMPORARY HIDDEN HKCC HKCR HKCU \
5354 HKDD HKEY_CLASSES_ROOT HKEY_CURRENT_CONFIG HKEY_CURRENT_USER HKEY_DYN_DATA \
5355 HKEY_LOCAL_MACHINE HKEY_PERFORMANCE_DATA HKEY_USERS HKLM HKPD HKU IDABORT \
5356 IDCANCEL IDIGNORE IDNO IDOK IDRETRY IDYES MB_ABORTRETRYIGNORE MB_DEFBUTTON1 \
5357 MB_DEFBUTTON2 MB_DEFBUTTON3 MB_DEFBUTTON4 MB_ICONEXCLAMATION \
5358 MB_ICONINFORMATION MB_ICONQUESTION MB_ICONSTOP MB_OK MB_OKCANCEL \
5359 MB_RETRYCANCEL MB_RIGHT MB_SETFOREGROUND MB_TOPMOST MB_YESNO \
5360 MB_YESNOCANCEL NORMAL OFFLINE READONLY SW_SHOWMAXIMIZED SW_SHOWMINIMIZED \
5361 SW_SHOWNORMAL SYSTEM TEMPORARY auto colored false force hide ifnewer nevershow \
5362 normal off on show silent silentlog smooth true try lzma zlib bzip2 none listonly textonly \
5363 both top left bottom right license components directory instfiles uninstConfirm custom \
5364 all leave current ifdiff lastused LEFT RIGHT CENTER dlg_id ALT CONTROL EXT SHIFT \
5365 open print manual alwaysoff
5367 #User defined:
5368 #keywords4.$(file.patterns.nsis)=MyFunction MySomethingElse
5372 # compiling/building simply checks for the correct symantics....
5373 command.compile.$(file.patterns.nsis)=c:/program files/nsis/makensis.exe "$(FilePath)"
5374 command.build.$(file.patterns.nsis)=c:/program files/nsis/makensis.exe "$(FilePath)"
5376 command.go.$(file.patterns.nsis)=$(FileName).exe
5378 command.help.$(file.patterns.nsis)=$(CurrentWord)!C:\Program files\NSIS\NSIS.chm
5379 command.help.subsystem.$(file.patterns.nsis)=4
5381 comment.block.nsis=;
5382 comment.block.at.line.start.nsis=1
5383 comment.stream.start.nsis=/*
5384 comment.stream.end.nsis=*/
5385 comment.box.start.nsis=/*
5386 comment.box.middle.nsis=;
5387 comment.box.end.nsis=*/
5391 ###############################################################################
5392 # From opal.properties
5393 # Define SciTE settings for Opal files.
5395 filter.opal=OPAL (impl sign)|*.impl;*.sign|
5397 *filter.opal=$(filter.opal)
5399 file.patterns.opal=*.impl;*.sign
5400 lexer.$(file.patterns.opal)=opal
5401 *language.opal=Opal|impl||
5403 keywordclass.opal_keywords=ALL AND ANDIF ANY AS ASSERT AXM COMPLETELY DATA DEF DERIVE \
5404 DFD DISCRIMINATORS ELSE EX EXTERNAL FI FIX FUN IF IMPLEMENTATION IMPLIES IMPORT \
5405 IN INHERIT INJECTIONS INTERFACE INTERNAL LAW LAZY LEFTASSOC LET MODULE NOT ONLY \
5406 OR ORIF OTHERWISE POST PRE PRED PRIORITY PROPERTIES REALIZES REQUIRE RIGHTASSOC \
5407 SELECTORS SIGNATURE SORT SPC SPEC SPECIFICATION STRUCTURE THE THEN THEORY THM \
5408 TYPE UNIQ WHERE
5410 keywordclass.opal_sorts=aEntry agent align anchor ans arg arg1 arg2 array \
5411 arrowWhere bag bitmap bool bstree byte callback canvasEditor capStyle channel \
5412 char childstat codom codomFrom codomTo color colorModel com composeOp config \
5413 configCom cursor dArray data data1 data11 data2 data21 data3 data31 data4 \
5414 data41 dataFrom dataTo defaultPrio denotation device dist distOut dom domFrom \
5415 domTo drawing dyn emitter env event eventInfo file filemode filestat filetype \
5416 first first1 first2 first3 fission fmt font from from1 from2 funct group groupid \
5417 heap iconfig image in inData index inode input int inter interdom interpreter \
5418 iseq items joinStyle justifyHow long manager managerRequest map mapEntry mark \
5419 mid modifier nat natMap OBJECT option orient out outData output packOp pair \
5420 parser permission point positionRequest process procstat quad range real \
5421 regulator rel relief res res1 res2 result role sap script scroller scrollView \
5422 scrollWindow searchOpt second seekMode selector semaphor seq seqEntry set \
5423 setEntry short sigaction sighandler sigmask signal size sizeRequest some \
5424 sreal state stateId stateRequest string subrel tag textEditor time to tree \
5425 triple union user userid version view void wconfig wconfigCom wday widget \
5426 window wrapStyle
5428 keywords.$(file.patterns.opal)=$(keywordclass.opal_keywords)
5429 keywords2.$(file.patterns.opal)=$(keywordclass.opal_sorts)
5432 # Opal styles
5437 ###############################################################################
5438 # From oscript.properties
5439 # Defines SciTE settings for OScript sources; osx files and/or OSpace dumps.
5440 # OScript is a programming language used to develop applications for the
5441 # Livelink server platform.
5443 ##############################################################################
5444 # Specify file extension and lexer class.
5446 file.patterns.oscript=*.osx
5447 filter.oscript=OScript (osx)|$(file.patterns.oscript)|
5448 *filter.oscript=$(filter.oscript)
5449 lexer.$(file.patterns.oscript)=oscript
5451 ##############################################################################
5452 # Specify various editor parameters.
5454 word.chars.oscript=$(chars.alpha)$(chars.numeric)_$
5455 word.characters.$(file.patterns.oscript)=$(word.chars.oscript)
5457 #comment.block.at.line.start.oscript=1
5458 comment.block.oscript=//~
5459 #~ comment.stream.start.oscript=#ifdef DOC
5460 #~ comment.stream.end.oscript=#endif
5461 comment.stream.start.oscript=/*
5462 comment.stream.end.oscript=*/
5463 comment.box.start.oscript=/*
5464 comment.box.middle.oscript= *
5465 comment.box.end.oscript= */
5467 statement.indent.$(file.patterns.oscript)=6 case default else for if \
5468 repeat switch while
5469 statement.lookback.$(file.patterns.oscript)=20
5470 statement.end.$(file.patterns.oscript)=10 ;
5471 block.start.$(file.patterns.oscript)=10 if
5472 block.end.$(file.patterns.oscript)=10 end
5473 indent.maintain.$(file.patterns.oscript)=1
5474 indent.size.$(file.patterns.oscript)=4
5475 use.tabs.$(file.patterns.oscript)=1
5476 tab.size.$(file.patterns.oscript)=4
5478 preprocessor.symbol.$(file.patterns.oscript)=#
5479 preprocessor.start.$(file.patterns.oscript)=ifdef ifndef
5480 preprocessor.middle.$(file.patterns.oscript)=else
5481 preprocessor.end.$(file.patterns.oscript)=endif
5483 ##############################################################################
5484 # Specify API autocompletion and calltip help.
5486 api.$(file.patterns.oscript)=$(SciteDefaultHome)\api\oscript.api
5487 autocomplete.oscript.ignorecase=1
5488 calltip.oscript.ignorecase=1
5489 calltip.oscript.use.escapes=1
5490 calltip.oscript.word.characters=_abcdefghijklmnopqrstuvwxyzABCDEFGHIJKLMNOPQRSTUVWXYZ$.
5492 ##############################################################################
5493 # Define keyword classes separately according to the language semantics
5494 # before grouping them to keywords for styling. OScript is not case-sensitive;
5495 # all keywords configured here must be entered in lower-case.
5497 # Language native value and reference types.
5498 keywordclass.type=\
5499 assoc boolean bytes date dynamic error extern file integer list long object \
5500 point real recarray record script string
5502 # Word-like (literal) operators (boolean).
5503 keywordclass.operator=\
5504 and eq ge gt le lt ne not or xor
5506 # Code-flow control statements.
5507 keywordclass.oscript.control=\
5508 break breakif by case continue continueif default downto else elseif end for \
5509 goto if in repeat switch to until while
5511 # Keywords to declare functions.
5512 keywordclass.function=\
5513 function return void
5515 # Various language native keywords and reserved words.
5516 keywordclass.miscellaneous=\
5517 dll inbyref inout linked nodebug super this xcmd xfcn
5519 # Constants with values and defaults for primitive types.
5520 keywordclass.constant=\
5521 false true undefined
5523 # Language native constants (type classification integers).
5524 keywordclass.coreconstant=\
5525 booleantype bytestype datatype dynamictype errortype externtype integertype \
5526 listtype longtype objecttype objreftype pointtype realtype scripttype \
5527 stringtype undefinedtype voidtype
5529 # Language native functions not bound to any object (global).
5530 keywordclass.corefunction=\
5531 datatypename echo echodebug echoerror echoinfo echostamp echowarn \
5532 getfeatures isdefined iserror isfeature isinvokable isnoterror isnotset \
5533 isobject isset isundefined length nparameters parameters pointh pointv type
5535 # Object types available in Livelink kernel and core modules.
5536 keywordclass.builtintype=\
5537 cachetree capiconnect capierr capilog capilogin compiler dapisession \
5538 dapinode dapiversion dapistream filecopy fileprefs frame javaobject \
5539 mailmessage pop3session smtpsession ssloptions patfind patchange regex \
5540 socket sqlconnection sqlcursor uapisession uapiuser wapisession wapimap \
5541 wapimaptask wapiwork wapisubwork domattr domcdatasection domcharacterdata \
5542 domcomment domdocument domdocumentfragment domdocumenttype domelement \
5543 domentity domentityreference domimplementation domnamednodemap domnode \
5544 domnodelist domnotation domparser domprocessinginstruction domtext saxparser \
5545 xslprocessor
5547 # Singletons available in Livelink kernel and core modules; they offer only
5548 # static methods to call.
5549 keywordclass.builtinobject=\
5550 capi dapi env global language logging math memcached otds pattern security \
5551 sql str system uapi vis wapi web zip
5553 # Keywords usable in WebLingo sources (HTML templates including OScript).
5554 keywordclass.weblingo=\
5555 call html oscript
5557 ##############################################################################
5558 # Define keyword groups that are recognized by the lexer and can be assigned
5559 # different styles.
5561 # Language native keywords: SCE_OSCRIPT_KEYWORD state.
5562 keywords.$(file.patterns.oscript)=$(keywordclass.oscript.control) \
5563 $(keywordclass.function) $(keywordclass.miscellaneous)
5565 # Constants: SCE_OSCRIPT_CONSTANT state.
5566 keywords2.$(file.patterns.oscript)=$(keywordclass.constant) \
5567 $(keywordclass.coreconstant)
5569 # Word-like (literal) operators: SCE_OSCRIPT_OPERATOR state.
5570 keywords3.$(file.patterns.oscript)=$(keywordclass.operator)
5572 # Value and reference (object) types: SCE_OSCRIPT_TYPE state.
5573 keywords4.$(file.patterns.oscript)=$(keywordclass.type) \
5574 $(keywordclass.builtintype)
5576 # Language native (global) functions: SCE_OSCRIPT_FUNCTION state.
5577 keywords5.$(file.patterns.oscript)=$(keywordclass.corefunction)
5579 # Core static objects: SCE_OSCRIPT_OBJECT state.
5580 keywords6.$(file.patterns.oscript)=$(keywordclass.builtinobject)
5582 ##############################################################################
5583 # Define Style definitions supported by the lexical states. There are multiple
5584 # states for language keyword groups although they all are reserved words; to
5585 # be able ot assign them different styles.
5587 # Documentation comment; a text delimited by preprocessor directives
5588 # Type available in the language, in kernel or code modules.
5589 # Global function in the language, in kernel or code modules.
5591 braces.oscript.style=12
5593 ##############################################################################
5594 # Specify help.
5596 if PLAT_WIN
5597         command.help.$(file.patterns.oscript)=$(CurrentWord)!C:\LL971\builder\documentation.chm
5598         command.help.subsystem.$(file.patterns.oscript)=4
5602 ###############################################################################
5603 # From others.properties
5604 # Define SciTE settings for other simple files.
5606 file.patterns.props=*.properties;*.session;*.ini;*.inf;*.url;*.cfg;*.cnf;*.aut
5607 file.patterns.text=*.txt;*.log;*.lst;*.doc;*.diz;*.nfo
5608 file.patterns.batch=*.bat;*.cmd;*.nt
5609 file.patterns.diff=*.diff;*.patch
5610 file.patterns.make=makefile;Makefile;*.mak;configure
5611 file.patterns.indent=*.indent
5613 *source.patterns.props=$(file.patterns.props);
5614 *source.patterns.batch=$(file.patterns.batch);
5615 *source.patterns.diff=$(file.patterns.diff);
5616 *source.patterns.make=$(file.patterns.make);*.iface;
5618 filter.properties=Properties (ini inf reg url cfg cnf)|$(file.patterns.props)|
5619 filter.text=Text (txt log lst doc diz nfo)|$(file.patterns.text);make*|
5620 filter.batch=Batch (bat cmd nt)|$(file.patterns.batch)|
5621 filter.diff=Difference (diff patch)|$(file.patterns.diff)|
5623 *filter.properties=$(filter.properties)
5624 *filter.text=$(filter.text)
5626 lexer.$(file.patterns.props)=props
5627 lexer.$(file.patterns.batch)=batch
5628 lexer.*.err=errorlist
5629 lexer.$(file.patterns.make)=makefile
5630 lexer.*.iface=makefile
5631 lexer.$(file.patterns.diff)=diff
5632 lexer.$(file.patterns.indent)=indent
5634 *language.batch=&Batch|bat||
5635 *language.difference=&Difference|diff||
5636 *language.errorlist=&Errorlist|err||
5637 *language.properties=&Properties|properties||
5638 *language.makefile=&Makefile|mak|$(keyMake)|
5639 *language._text=Text|txt|$(keyText)|
5640 *language.indent=Indent|indent|$(keyIndent)|
5642 word.characters.$(file.patterns.text)=$(chars.alpha)$(chars.numeric)$(chars.accented)-'
5644 colour.other.operator=fore:#B06000
5646 # Properties styles
5648 comment.block.props=#~
5649 preprocessor.symbol.$(file.patterns.make)=!
5650 preprocessor.start.$(file.patterns.make)=IF IFDEF IFNDEF
5651 preprocessor.middle.$(file.patterns.make)=ELSE ELSEIF ELSEIFDEF ELSEIFNDEF
5652 preprocessor.end.$(file.patterns.make)=ENDIF
5654 # Batch styles
5656 # List from http://www.easydos.com/dosindex.html and https://sourceforge.net/p/scintilla/bugs/1686/
5657 # I limit here the commands to those built in command.com, ie. I don't list external Dos commands
5658 # if [no] (test) (command) -- test is EXIST (filename) | (string1)==(string2) | ERRORLEVEL (number)
5659 # for %%(variable) IN (set) DO (command) -- variable is [a-zA-Z] -- eg for %%X in (*.txt) do type %%X
5660 # Also includes device names.
5661 keywordclass.batch=\
5662 assoc aux break call cd chcp chdir choice cls cmdextversion \
5663 color com1 com2 com3 com4 con copy ctty date defined \
5664 del dir do dpath echo else endlocal erase errorlevel exist \
5665 exit for ftype goto if in lpt1 lpt2 lpt3 lpt4 md mkdir move \
5666 not nul path pause popd prompt prn pushd rd rem ren \
5667 rename rmdir set setlocal shift start time title type ver \
5668 verify vol
5669 keywords.$(file.patterns.batch)=$(keywordclass.batch)
5671 # Optional list of external commands to highlight in style 5.
5672 # If not set all commands are highlighted in style 5.
5673 #keywords2.$(file.patterns.batch)=append attrib chkdsk comp diskcomp
5676 comment.block.batch=REM ~
5678 # Makefile styles
5681 comment.block.makefile=#~
5684 error.background=back:#FFF7E7,eolfilled
5686 lexer.errorlist.value.separate=1
5687 #lexer.errorlist.escape.sequences=1
5689 # Difference styles
5692 command.build.makefile=make
5693 command.build.*.mak=make
5695 command.help.*.properties="file://$(SciteDefaultHome)/SciTEDoc.html#property-$(CurrentSelection)"
5696 command.help.subsystem.*.properties=2
5698 if PLAT_WIN
5699         command.go.*.bat="$(FileNameExt)"
5700         command.name.0.*.bat=Execute Selection
5701         command.0.*.bat=$(CurrentSelection)
5702         command.name.1.*.mak=nmake
5703         command.1.*.mak=nmake -f $(FileNameExt)
5707 ###############################################################################
5708 # From pascal.properties
5709 # Define SciTE settings for Pascal files.
5710 # Changed by Fernando Lozano <fsl@centroin.com.br> for Free Pascal
5711 # Changed by Mathias Rauen <scite@madshi.net> for Delphi
5712 # Changed by Marko Njezic <sf@maxempire.com> to match new LexPascal lexer and updated for Delphi XE4
5714 filter.pascal=Pascal (dpr dpk pas dfm inc pp)|*.dpr;*.dpk;*.pas;*.dfm;*.inc;*.pp|
5716 *filter.pascal=$(filter.pascal)
5718 file.patterns.pascal=*.dpr;*.pas;*.dfm;*.inc;*.pp
5719 file.patterns.pascal.package=*.dpk
5720 file.patterns.pascal.all=$(file.patterns.pascal);$(file.patterns.pascal.package)
5721 lexer.$(file.patterns.pascal.all)=pascal
5722 *language.pascal=Pascal|pas||
5724 keywordclass.pascal=absolute abstract and array as asm assembler automated begin case \
5725 cdecl class const constructor delayed deprecated destructor dispid dispinterface \
5726 div do downto dynamic else end except experimental export exports external far \
5727 file final finalization finally for forward function goto helper if \
5728 implementation in inherited initialization inline interface is label library \
5729 message mod near nil not object of on operator or out overload override packed \
5730 pascal platform private procedure program property protected public published \
5731 raise record reference register reintroduce repeat resourcestring safecall \
5732 sealed set shl shr static stdcall strict string then threadvar to try type unit \
5733 unsafe until uses var varargs virtual while winapi with xor
5735 keywordclass.pascal.smart=add default implements index name nodefault read readonly \
5736 remove stored write writeonly
5738 keywordclass.pascal.package=package contains requires
5740 keywords.$(file.patterns.pascal)=$(keywordclass.pascal) $(keywordclass.pascal.smart)
5741 keywords.$(file.patterns.pascal.package)=$(keywordclass.pascal) $(keywordclass.pascal.smart) $(keywordclass.pascal.package)
5743 # If enabled some keywords will only be highlightend in appropriate context.
5744 # As implemented those are keywords related to property and DLL exports declarations
5745 lexer.pascal.smart.highlighting=1
5747 # Pascal styles
5750 # Braces are only matched in operator style
5751 braces.pascal.style=13
5753 comment.block.pascal=//~
5754 comment.stream.start.pascal={
5755 comment.stream.end.pascal=}
5756 comment.box.start.pascal=(*
5757 comment.box.middle.pascal= *
5758 comment.box.end.pascal= *)
5760 statement.indent.$(file.patterns.pascal)=9 case class do else for then \
5761 private protected public published repeat try while type
5762 statement.end.$(file.patterns.pascal)=13 ;
5763 statement.lookback.$(file.patterns.pascal)=20
5764 block.start.$(file.patterns.pascal)=9 begin
5765 block.end.$(file.patterns.pascal)=9 end
5767 #using virtual pascal
5768 #pc=C:\Vp21\Bin.w32\Vpc.exe -VC:\Vp21\Bin.w32\Vp.vpo "$(FilePath)"
5770 #using free pascal
5772 # compile
5773 command.compile.*.pas=fpc "$(FilePath)"
5775 # normal execute
5776 if PLAT_WIN
5777         command.go.*.pas="$(FileName).exe"
5778         command.go.subsystem.*.pas=2
5779 if PLAT_GTK
5780         command.go.*.pas="kvt -e $(FileName)"
5782 # build
5783 command.build.*.pas=fpc -B "$(FilePath)"
5784 command.build.subsystem.*.pas=1
5786 command.name.0.*.pas=Debug Compile
5787 command.0.*.pas=fpc -g "$(FilePath)"
5788 command.name.1.*.pas=Debug Build
5789 command.1.*.pas=fpc -g -B "$(FilePath)"
5790 command.name.2.*.pas=GDB
5791 if PLAT_WIN
5792         command.2.*.pas=gdbpasw "$(FileName)"
5793 if PLAT_GTK
5794         command.2.*.pas=gdb "$(FileName)"
5795         command.name.3.*.pas=DDD
5796         command.3.*.pas=ddd "$(FileName)"
5801 ###############################################################################
5802 # From perl.properties
5803 # Define SciTE settings for Perl, Bash, and AWK files.
5805 file.patterns.perl=*.pl;*.pm;*.pod
5806 file.patterns.bash=*.sh;*.bsh;configure;*.ksh
5807 file.patterns.awk=*.awk
5809 *source.patterns.perl=$(file.patterns.perl);
5810 *source.patterns.bash=$(file.patterns.bash);
5812 shbang.perl=pl
5813 shbang.sh=sh
5814 shbang.bash=sh
5816 shbang.gawk=awk
5817 shbang.nawk=awk
5818 shbang.mawk=awk
5820 filter.perl=Perl (pl pm)|$(file.patterns.perl)|
5821 filter.bash=Bash (sh bsh)|$(file.patterns.bash)|
5822 filter.awk=GAWK  (awk)|$(file.patterns.awk)|
5824 *filter.perl=$(filter.perl)
5825 *filter.bash=$(filter.bash)
5827 *language.perl=Pe&rl|pl||
5828 *language.shell=Shell|sh||
5830 lexer.$(file.patterns.perl)=perl
5831 lexer.$(file.patterns.bash)=bash
5832 lexer.$(file.patterns.awk)=perl
5834 keywords.$(file.patterns.perl)=\
5835 NULL __FILE__ __LINE__ __PACKAGE__ __DATA__ __END__ AUTOLOAD \
5836 BEGIN CORE DESTROY END EQ GE GT INIT LE LT NE CHECK abs accept \
5837 alarm and atan2 bind binmode bless caller chdir chmod chomp chop \
5838 chown chr chroot close closedir cmp connect continue cos crypt \
5839 dbmclose dbmopen defined delete die do dump each else elsif endgrent \
5840 endhostent endnetent endprotoent endpwent endservent eof eq eval \
5841 exec exists exit exp fcntl fileno flock for foreach fork format \
5842 formline ge getc getgrent getgrgid getgrnam gethostbyaddr gethostbyname \
5843 gethostent getlogin getnetbyaddr getnetbyname getnetent getpeername \
5844 getpgrp getppid getpriority getprotobyname getprotobynumber getprotoent \
5845 getpwent getpwnam getpwuid getservbyname getservbyport getservent \
5846 getsockname getsockopt glob gmtime goto grep gt hex if index \
5847 int ioctl join keys kill last lc lcfirst le length link listen \
5848 local localtime lock log lstat lt map mkdir msgctl msgget msgrcv \
5849 msgsnd my ne next no not oct open opendir or ord our pack package \
5850 pipe pop pos print printf prototype push quotemeta qu \
5851 rand read readdir readline readlink readpipe recv redo \
5852 ref rename require reset return reverse rewinddir rindex rmdir \
5853 scalar seek seekdir select semctl semget semop send setgrent \
5854 sethostent setnetent setpgrp setpriority setprotoent setpwent \
5855 setservent setsockopt shift shmctl shmget shmread shmwrite shutdown \
5856 sin sleep socket socketpair sort splice split sprintf sqrt srand \
5857 stat study sub substr symlink syscall sysopen sysread sysseek \
5858 system syswrite tell telldir tie tied time times truncate \
5859 uc ucfirst umask undef unless unlink unpack unshift untie until \
5860 use utime values vec wait waitpid wantarray warn while write \
5861 xor \
5862 given when default break say state UNITCHECK __SUB__ fc
5864 keywords.$(file.patterns.awk)=\
5865 BEGIN END \
5866 if else while do for in break continue delete exit function return \
5867 print printf sprintf \
5868 system close getline next nextfile fflush \
5869 atan2 cos exp int log rand sin sqrt srand \
5870 asort asorti gensub sub gsub index length match split \
5871 strtonum substr tolower toupper \
5872 mktime strftime systime \
5873 and compl lshift or rshift xor \
5874 bindtextdomain dcgettext dcngettext \
5875 ARGC ARGIND ARGV BINMODE CONVFMT ENVIRON ERRNO FIELDWIDTHS \
5876 FILENAME FNR FS IGNORECASE LINT NF NR OFMT OFS ORS PROCINFO \
5877 RS RT RSTART RLENGTH SUBSEP TEXTDOMAIN
5880 comment.block.awk=#~
5881 block.start.$(file.patterns.awk)=10 {
5882 block.end.$(file.patterns.awk)=10 }
5885 word.characters.$(file.patterns.perl)=$(chars.alpha)$(chars.numeric)_$@%&
5887 comment.block.perl=#~
5888 block.start.$(file.patterns.perl)=10 {
5889 block.end.$(file.patterns.perl)=10 }
5891 colour.perl.heredoc=$(colour.embedded.comment)
5893 #fold.perl.package=1
5894 #fold.perl.pod=1
5896 # generic keywords
5897 bash_keywords1=alias \
5898 ar asa awk banner basename bash bc bdiff break \
5899 bunzip2 bzip2 cal calendar case cat cc cd chmod cksum \
5900 clear cmp col comm compress continue cp cpio crypt \
5901 csplit ctags cut date dc dd declare deroff dev df diff diff3 \
5902 dircmp dirname do done du echo ed egrep elif else env \
5903 esac eval ex exec exit expand export expr false fc \
5904 fgrep fi file find fmt fold for function functions \
5905 getconf getopt getopts grep gres hash head help \
5906 history iconv id if in integer jobs join kill local lc \
5907 let line ln logname look ls m4 mail mailx make \
5908 man mkdir more mt mv newgrp nl nm nohup ntps od \
5909 pack paste patch pathchk pax pcat perl pg pr print \
5910 printf ps pwd read readonly red return rev rm rmdir \
5911 sed select set sh shift size sleep sort spell \
5912 split start stop strings strip stty sum suspend \
5913 sync tail tar tee test then time times touch tr \
5914 trap true tsort tty type typeset ulimit umask unalias \
5915 uname uncompress unexpand uniq unpack unset until \
5916 uudecode uuencode vi vim vpax wait wc whence which \
5917 while who wpaste wstart xargs zcat
5919 # additional keywords from coreutils
5920 bash_keywords2=chgrp chown chroot dir dircolors \
5921 factor groups hostid install link md5sum mkfifo \
5922 mknod nice pinky printenv ptx readlink seq \
5923 sha1sum shred stat su tac unlink users vdir whoami yes
5925 keywords.$(file.patterns.bash)=$(bash_keywords1) $(bash_keywords2)
5927 word.characters.$(file.patterns.bash)=$(chars.alpha)$(chars.numeric)_$@%&
5929 comment.block.bash=#~
5931 colour.bash.heredoc=$(colour.embedded.comment)
5933 # Perl styles
5934 # The perl styles are set to lots of different foreground and background colours as an
5937 # Braces are only matched in operator style
5938 braces.perl.style=10
5940 # Bash styles
5941 # The bash styles are set to lots of different foreground and background colours as an
5942 # Braces are only matched in operator style
5943 braces.bash.style=7
5945 command.go.$(file.patterns.awk)=gawk -f $(FileNameExt)
5947 command.go.$(file.patterns.perl)=perl -w $(FileNameExt)
5949 command.compile.$(file.patterns.perl)=perl -c -w $(FileNameExt)
5950 command.name.0.$(file.patterns.perl)=Lint
5951 command.0.$(file.patterns.perl)=perl -MO=Lint,all $(FileNameExt)
5953 command.name.1.$(file.patterns.perl)=Check Syntax
5954 command.1.$(file.patterns.perl)=perl -cw $(FileNameExt)
5956 command.name.2.$(file.patterns.perl)=Code Profiler
5957 command.2.$(file.patterns.perl)=perl -d:DProf $(FileNameExt)
5959 command.name.3.$(file.patterns.perl)=Profiler Parser
5960 command.3.$(file.patterns.perl)=C:\Perl\bin\dprofpp.bat $(FileDir)\tmon.out
5962 command.go.$(file.patterns.bash)=bash $(FileNameExt)
5966 ###############################################################################
5967 # From pov.properties
5968 # Define SciTE settings for POV-Ray SDL files.
5970 file.patterns.pov=*.pov;*.inc
5972 filter.pov=POV-Ray SDL (pov)|$(file.patterns.pov)|
5974 *filter.pov=$(filter.pov)
5976 indent.size.*.pov=2
5977 tab.size.*.pov=2
5978 use.tabs.*.pov=0
5979 indent.size.*.inc=2
5980 tab.size.*.inc=2
5981 use.tabs.*.inc=0
5983 lexer.$(file.patterns.pov)=pov
5985 *language.povray=P&OV-Ray SDL|pov||
5987 word.chars.pov=$(chars.alpha)$(chars.numeric)_#
5988 word.characters.$(file.patterns.pov)=$(word.chars.pov)
5990 api.*.pov=POV-Ray_SDL.api
5991 #autocomplete.pov.ignorecase=1
5992 autocomplete.pov.start.characters=.
5993 #autocomplete.pov.fillups=(
5994 #calltip.pov_quote.ignorecase=1
5995 calltip.pov.word.characters=.$(word.chars.pov)
5997 comment.block.at.line.start.pov=1
5998 comment.block.pov=//~
5999 #~ comment.stream.start.pov=#ifdef BOOFOO
6000 #~ comment.stream.end.pov=#endif
6001 comment.stream.start.pov=/*
6002 comment.stream.end.pov=*/
6003 comment.box.start.pov=/*
6004 comment.box.middle.pov= *
6005 comment.box.end.pov= */
6007 #~ statement.indent.$(file.patterns.pov)=5 case catch class default do else for if \
6008 #~ private protected public struct try union while
6009 #~ statement.lookback.$(file.patterns.pov)=20
6010 #~ block.start.$(file.patterns.pov)=10 {
6011 #~ block.end.$(file.patterns.pov)=10 }
6012 #indent.maintain.$(file.patterns.pov)=1
6013 #indent.size.$(file.patterns.pov)=4
6014 #tab.size.$(file.patterns.pov)=4
6015 #use.tabs.$(file.patterns.pov)=1
6017 # Actually, these are SDL directives, but SciTE is seeking for the preprocessor.* properties
6018 preprocessor.symbol.$(file.patterns.pov)=#
6019 preprocessor.start.$(file.patterns.pov)=if ifdef ifndef switch while macro
6020 preprocessor.middle.$(file.patterns.pov)=else
6021 preprocessor.end.$(file.patterns.pov)=end
6023 # keywords(1) is for Language directives (#xxx)
6024 keywordclass.pov=declare local include undef fopen fclose read write default version \
6025 case range break debug error warning \
6026 if ifdef ifndef switch while macro else end
6028 keywords.$(file.patterns.pov)=$(keywordclass.pov)
6030 # keywords2 is for Objects & CSG & Appearance (xxx {})
6031 keywords2.$(file.patterns.pov)=camera light_source light_group \
6032 object blob sphere cylinder box cone height_field julia_fractal \
6033 lathe prism sphere_sweep superellipsoid sor text torus \
6034 bicubic_patch disc mesh mesh2 polygon triangle smooth_triangle \
6035 plane poly cubic quartic quadric isosurface parametric \
6036 union intersection difference merge function array spline \
6037 vertex_vectors normal_vectors uv_vectors face_indices normal_indices uv_indices \
6038 texture texture_list interior_texture \
6039 texture_map material_map image_map color_map colour_map pigment_map \
6040 normal_map slope_map bump_map density_map \
6041 pigment normal material interior finish reflection irid slope pigment_pattern image_pattern \
6042 warp media scattering density background fog sky_sphere rainbow \
6043 global_settings radiosity photons pattern \
6044 transform looks_like projected_through contained_by clipped_by bounded_by
6046 # keywords3 is for Types & Modifiers & Items
6047 keywords3.$(file.patterns.pov)=linear_spline quadratic_spline cubic_spline natural_spline bezier_spline b_spline \
6048 read write append inverse open \
6049 perspective orthographic fisheye ultra_wide_angle omnimax panoramic \
6050 spherical spotlight jitter circular orient \
6051 media_attenuation media_interaction shadowless parallel \
6052 refraction collect pass_through global_lights hierarchy sturm smooth \
6053 gif tga iff pot png pgm ppm jpeg tiff sys ttf \
6054 quaternion hypercomplex linear_sweep conic_sweep \
6055 type all_intersections split_union cutaway_textures \
6056 no_shadow no_image no_reflection double_illuminate hollow \
6057 uv_mapping all use_index use_color use_colour no_bump_scale \
6058 conserve_energy fresnel \
6059 average agate boxed bozo bumps cells crackle cylindrical density_file dents \
6060 facets granite leopard marble onion planar quilted radial ripples spotted waves wood wrinkles \
6061 solid use_alpha interpolate magnet noise_generator toroidal \
6062 ramp_wave triangle_wave sine_wave scallop_wave cubic_wave poly_wave \
6063 once map_type method fog_type hf_gray_16 charset ascii utf8 \
6064 rotate scale translate matrix location right up direction sky \
6065 angle look_at aperture blur_samples focal_point confidence variance \
6066 radius falloff tightness point_at area_light adaptive fade_distance fade_power \
6067 threshold strength water_level tolerance max_iteration precision slice \
6068 u_steps v_steps flatness inside_vector \
6069 accuracy max_gradient evaluate max_trace precompute \
6070 target ior dispersion dispersion_samples caustics \
6071 color colour rgb rgbf rgbt rgbft red green blue filter transmit gray hf \
6072 fade_color fade_colour quick_color quick_colour \
6073 brick checker hexagon brick_size mortar bump_size \
6074 ambient diffuse brilliance crand phong phong_size metallic specular \
6075 roughness reflection_exponent exponent thickness \
6076 gradient spiral1 spiral2 agate_turb form metric \
6077 offset df3 coords size mandel exterior julia \
6078 control0 control1 altitude turbulence octaves omega lambda \
6079 repeat flip black-hole orientation dist_exp major_radius \
6080 frequency phase intervals samples ratio absorption emission aa_threshold aa_level \
6081 eccentricity extinction distance turb_depth fog_offset fog_alt width arc_angle falloff_angle \
6082 adc_bailout ambient_light assumed_gamma irid_wavelength number_of_waves \
6083 always_sample brigthness count error_bound gray_threshold load_file \
6084 low_error_factor max_sample minimum_reuse nearest_count \
6085 pretrace_end pretrace_start recursion_limit save_file \
6086 spacing gather max_trace_level autostop expand_thresholds
6088 # keywords4 is for Predefined Identifiers
6089 keywords4.$(file.patterns.pov)=x y z t u v \
6090 yes no true false on off \
6091 clock clock_delta clock_on final_clock final_frame frame_number \
6092 image_height image_width initial_clock initial_frame pi version
6094 # keywords5 is for Predefined Functions
6095 keywords5.$(file.patterns.pov)=abs acos acosh asc asin asinh atan atanh atan2 \
6096 ceil cos cosh defined degrees dimensions dimension_size div exp file_exists floor \
6097 inside int ln log max min mod pow prod radians rand seed select sin sinh sqrt strcmp \
6098 strlen sum tan tanh val vdot vlength min_extent max_extent trace vaxis_rotate \
6099 vcross vrotate vnormalize vturbulence chr concat str strlwr strupr substr vstr \
6100 sqr cube reciprocal pwr
6102 # keywords6 is for User defined keywords 1
6103 keywords6.$(file.patterns.pov)=
6105 # keywords7 is for User defined keywords 2
6106 keywords7.$(file.patterns.pov)=
6108 # keywords8 is for User defined keywords 3
6109 keywords8.$(file.patterns.pov)=
6111 # POV-Ray SDL styles
6113 # Keywords (bozo test colors :-)
6114 # Braces are only matched in operator style
6115 braces.pov.style=4
6117 command.compile.*.pov=pvengine.exe $(FileName)
6118 command.build.*.pov=
6119 command.go.*.pov=pvengine.exe $(FileName)
6121 if PLAT_WIN
6122         command.help.$(file.patterns.pov)=$(CurrentWord)!D:\Programmes\UImages\POV-Ray 3.5\help\povray35.chm
6123         command.help.subsystem.$(file.patterns.pov)=4
6127 ###############################################################################
6128 # From powerpro.properties
6129 # Define SciTE settings for powerpro files.
6130 file.patterns.powerpro=*.powerpro
6132 filter.powerpro=PowerPro (powerpro)|$(file.patterns.powerpro)|
6133 *filter.powerpro=$(filter.powerpro)
6134 lexer.$(file.patterns.powerpro)=powerpro
6135 *language.powerpro=PowerPro|powerpro||
6137 keywordclass.control=\
6138 break do else elseif endfor endif for function global gt if ifelse \
6139 ifx jump local lt quit static
6141 keywords.$(file.patterns.powerpro)=$(keywordclass.control)
6143 keywordclass.plugins=\
6144 win.debug win.debugshow win.exists win.getdisplayrect win.getfocus win.gethandle win.getrect \
6145 win.getsystemmetrics win.gettext win.maximize win.minimize win.move win.sendkeys win.setdebug \
6146 win.setfocus win.setrect win.settext win.show
6148 keywordclass.functions=\
6149 bar case clip env exec fill flag floattostring format formattime ftos \
6150 index input inputcancel inputdefault inputdialog join length messagebox mouse \
6151 not note readline remove replace replacechars replaceg revindex select \
6152 stof validpath visiblewindow wait wait.activity wait.for wait.forinterval wait.message \
6153 wait.quit wait.ready wait.sleep wait.until wallpaper window window word
6155 keywords2.$(file.patterns.powerpro)=$(keywordclass.plugins)|$(keywordclass.functions)
6157 calltip.powerpro.word.characters=$(chars.alpha)$(chars.numeric)_
6158 comment.block.powerpro=//~
6159 comment.stream.start.powerpro=/*
6160 comment.stream.end.powerpro=*/
6161 comment.box.start.powerpro=/*
6162 comment.box.middle.powerpro= *
6163 comment.box.end.powerpro= */
6165 # Autocomplete and call tip settings
6166 #api.*.powerpro=$(SciteDefaultHome)\api\powerpro.api
6167 word.characters.*.powerpro=$(chars.alpha)$(chars.numeric)@$_
6169 # Braces are only matched in operator style
6170 braces.powerpro.style=11
6173 command.go.$(file.patterns.powerpro)="$(FilePath)"
6174 command.go.subsystem.$(file.patterns.powerpro)=2
6176 command.help.$(file.patterns.powerpro)=$(CurrentWord)!C:\Program Files\PowerPro\powerpro.chm
6177 command.help.subsystem.$(file.patterns.powerpro)=4
6181 ###############################################################################
6182 # From powershell.properties
6183 # Define SciTE settings for PowerShell files
6185 file.patterns.powershell=*.ps1
6187 filter.powershell=PowerShell (ps1)|$(file.patterns.powershell)|
6189 *filter.powershell=$(filter.powershell)
6191 lexer.$(file.patterns.powershell)=powershell
6193 *language.powershell=PowerShell|ps1||
6195 word.characters.$(file.patterns.powershell)=$(chars.alpha)$(chars.numeric)_-$
6197 # Keywords
6198 keywords.$(file.patterns.powershell)=\
6199 begin break catch continue data do dynamicparam else elseif end exit filter \
6200 finally for foreach from function if in local param private process return \
6201 switch throw trap try until where while
6203 # Cmdlets
6204 keywords2.$(file.patterns.powershell)=\
6205 add-computer add-content add-history add-member add-pssnapin add-type \
6206 checkpoint-computer clear-content clear-eventlog clear-history clear-item \
6207 clear-itemproperty clear-variable compare-object complete-transaction \
6208 connect-wsman convert-path convertfrom-csv convertfrom-securestring \
6209 convertfrom-stringdata convertto-csv convertto-html convertto-securestring \
6210 convertto-xml copy-item copy-itemproperty debug-process disable-computerrestore \
6211 disable-psbreakpoint disable-pssessionconfiguration disable-wsmancredssp \
6212 disconnect-wsman enable-computerrestore enable-psbreakpoint enable-psremoting \
6213 enable-pssessionconfiguration enable-wsmancredssp enter-pssession exit-pssession \
6214 export-alias export-clixml export-console export-counter export-csv \
6215 export-formatdata export-modulemember export-pssession foreach-object \
6216 format-custom format-list format-table format-wide get-acl get-alias \
6217 get-authenticodesignature get-childitem get-command get-computerrestorepoint \
6218 get-content get-counter get-credential get-culture get-date get-event \
6219 get-eventlog get-eventsubscriber get-executionpolicy get-formatdata get-help \
6220 get-history get-host get-hotfix get-item get-itemproperty get-job get-location \
6221 get-member get-module get-psbreakpoint get-pscallstack get-psdrive \
6222 get-psprovider get-pssession get-pssessionconfiguration get-pssnapin \
6223 get-pfxcertificate get-process get-random get-service get-tracesource \
6224 get-transaction get-uiculture get-unique get-variable get-wsmancredssp \
6225 get-wsmaninstance get-winevent get-wmiobject group-object import-alias \
6226 import-clixml import-counter import-csv import-localizeddata import-module \
6227 import-pssession invoke-command invoke-expression invoke-history invoke-item \
6228 invoke-wsmanaction invoke-wmimethod join-path limit-eventlog measure-command \
6229 measure-object move-item move-itemproperty new-alias new-event new-eventlog \
6230 new-item new-itemproperty new-module new-modulemanifest new-object new-psdrive \
6231 new-pssession new-pssessionoption new-service new-timespan new-variable \
6232 new-wsmaninstance new-wsmansessionoption new-webserviceproxy out-default \
6233 out-file out-gridview out-host out-null out-printer out-string pop-location \
6234 push-location read-host receive-job register-engineevent register-objectevent \
6235 register-pssessionconfiguration register-wmievent remove-computer remove-event \
6236 remove-eventlog remove-item remove-itemproperty remove-job remove-module \
6237 remove-psbreakpoint remove-psdrive remove-pssession remove-pssnapin \
6238 remove-variable remove-wsmaninstance remove-wmiobject rename-item \
6239 rename-itemproperty reset-computermachinepassword resolve-path restart-computer \
6240 restart-service restore-computer resume-service select-object select-string \
6241 select-xml send-mailmessage set-acl set-alias set-authenticodesignature \
6242 set-content set-date set-executionpolicy set-item set-itemproperty set-location \
6243 set-psbreakpoint set-psdebug set-pssessionconfiguration set-service \
6244 set-strictmode set-tracesource set-variable set-wsmaninstance \
6245 set-wsmanquickconfig set-wmiinstance show-eventlog sort-object split-path \
6246 start-job start-process start-service start-sleep start-transaction \
6247 start-transcript stop-computer stop-job stop-process stop-service \
6248 stop-transcript suspend-service tee-object test-computersecurechannel \
6249 test-connection test-modulemanifest test-path test-wsman trace-command \
6250 undo-transaction unregister-event unregister-pssessionconfiguration \
6251 update-formatdata update-list update-typedata use-transaction wait-event \
6252 wait-job wait-process where-object write-debug write-error write-eventlog \
6253 write-host write-output write-progress write-verbose write-warning
6255 # Aliases
6256 keywords3.$(file.patterns.powershell)=\
6257 ac asnp cat cd chdir clc clear clhy cli clp cls clv compare copy cp cpi cpp cvpa \
6258 dbp del diff dir ebp echo epal epcsv epsn erase etsn exsn fc fl foreach ft fw \
6259 gal gbp gc gci gcm gcs gdr ghy gi gjb gl gm gmo gp gps group gsn gsnp gsv gu gv \
6260 gwmi h history icm iex ihy ii ipal ipcsv ipmo ipsn ise iwmi kill lp ls man md \
6261 measure mi mount move mp mv nal ndr ni nmo nsn nv ogv oh popd ps pushd pwd r rbp \
6262 rcjb rd rdr ren ri rjb rm rmdir rmo rni rnp rp rsn rsnp rv rvpa rwmi sajb sal \
6263 saps sasv sbp sc select set si sl sleep sort sp spjb spps spsv start sv swmi tee \
6264 type where wjb write
6266 # Functions
6267 keywords4.$(file.patterns.powershell)=\
6268 clear-host disable-psremoting enable-psremoting get-verb help importsystemmodules \
6269 mkdir more prompt psedit tabexpansion
6271 # User-defined keywords
6272 #keywords5.$(file.patterns.powershell)=
6274 # Comments
6275 comment.block.powershell=#~
6276 comment.block.at.line.start.powershell=1
6278 # PowerShell Styles
6282 ###############################################################################
6283 # From ps.properties
6284 # Define SciTE settings for PostScript files.
6286 file.patterns.ps=*.ps
6288 filter.ps=PostScript (ps)|$(file.patterns.ps)|
6290 *filter.ps=$(filter.ps)
6292 lexer.$(file.patterns.ps)=ps
6294 *language.postscript=P&ostScript|ps||
6296 ps.tokenize=0
6297 ps.level=3
6299 comment.block.ps=%~
6301 # Postscript level 1 operators
6302 keywords.$(file.patterns.ps)=\
6303 $error = == FontDirectory StandardEncoding UserObjects abs add aload \
6304 anchorsearch and arc arcn arcto array ashow astore atan awidthshow begin bind \
6305 bitshift bytesavailable cachestatus ceiling charpath clear cleardictstack \
6306 cleartomark clip clippath closefile closepath concat concatmatrix copy copypage \
6307 cos count countdictstack countexecstack counttomark currentcmykcolor \
6308 currentcolorspace currentdash currentdict currentfile currentflat currentfont \
6309 currentgray currenthsbcolor currentlinecap currentlinejoin currentlinewidth \
6310 currentmatrix currentmiterlimit currentpagedevice currentpoint currentrgbcolor \
6311 currentscreen currenttransfer cvi cvlit cvn cvr cvrs cvs cvx def defaultmatrix \
6312 definefont dict dictstack div dtransform dup echo end eoclip eofill eq \
6313 erasepage errordict exch exec execstack executeonly executive exit exp false \
6314 file fill findfont flattenpath floor flush flushfile for forall ge get \
6315 getinterval grestore grestoreall gsave gt idetmatrix idiv idtransform if ifelse \
6316 image imagemask index initclip initgraphics initmatrix inustroke invertmatrix \
6317 itransform known kshow le length lineto ln load log loop lt makefont mark \
6318 matrix maxlength mod moveto mul ne neg newpath noaccess nor not null nulldevice \
6319 or pathbbox pathforall pop print prompt pstack put putinterval quit rand rcheck \
6320 rcurveto read readhexstring readline readonly readstring rectstroke repeat \
6321 resetfile restore reversepath rlineto rmoveto roll rotate round rrand run save \
6322 scale scalefont search setblackgeneration setcachedevice setcachelimit \
6323 setcharwidth setcolorscreen setcolortransfer setdash setflat setfont setgray \
6324 sethsbcolor setlinecap setlinejoin setlinewidth setmatrix setmiterlimit \
6325 setpagedevice setrgbcolor setscreen settransfer setvmthreshold show showpage \
6326 sin sqrt srand stack start status statusdict stop stopped store string \
6327 stringwidth stroke strokepath sub systemdict token token transform translate \
6328 true truncate type ueofill undefineresource userdict usertime version vmstatus \
6329 wcheck where widthshow write writehexstring writestring xcheck xor
6331 # Postscript level 2 operators
6332 keywords2.$(file.patterns.ps)=\
6333 GlobalFontDirectory ISOLatin1Encoding SharedFontDirectory UserObject arct \
6334 colorimage cshow currentblackgeneration currentcacheparams currentcmykcolor \
6335 currentcolor currentcolorrendering currentcolorscreen currentcolorspace \
6336 currentcolortransfer currentdevparams currentglobal currentgstate \
6337 currenthalftone currentobjectformat currentoverprint currentpacking \
6338 currentpagedevice currentshared currentstrokeadjust currentsystemparams \
6339 currentundercolorremoval currentuserparams defineresource defineuserobject \
6340 deletefile execform execuserobject filenameforall fileposition filter \
6341 findencoding findresource gcheck globaldict glyphshow gstate ineofill infill \
6342 instroke inueofill inufill inustroke languagelevel makepattern packedarray \
6343 printobject product realtime rectclip rectfill rectstroke renamefile \
6344 resourceforall resourcestatus revision rootfont scheck selectfont serialnumber \
6345 setbbox setblackgeneration setcachedevice2 setcacheparams setcmykcolor setcolor \
6346 setcolorrendering setcolorscreen setcolorspace setcolortranfer setdevparams \
6347 setfileposition setglobal setgstate sethalftone setobjectformat setoverprint \
6348 setpacking setpagedevice setpattern setshared setstrokeadjust setsystemparams \
6349 setucacheparams setundercolorremoval setuserparams setvmthreshold shareddict \
6350 startjob uappend ucache ucachestatus ueofill ufill undef undefinefont \
6351 undefineresource undefineuserobject upath ustroke ustrokepath vmreclaim \
6352 writeobject xshow xyshow yshow
6354 # Postscript level 3 operators
6355 keywords3.$(file.patterns.ps)=\
6356 cliprestore clipsave composefont currentsmoothness findcolorrendering \
6357 setsmoothness shfill
6359 # RIP-specific operators (Ghostscript)
6360 keywords4.$(file.patterns.ps)=\
6361 .begintransparencygroup .begintransparencymask .bytestring .charboxpath \
6362 .currentaccuratecurves .currentblendmode .currentcurvejoin .currentdashadapt \
6363 .currentdotlength .currentfilladjust2 .currentlimitclamp .currentopacityalpha \
6364 .currentoverprintmode .currentrasterop .currentshapealpha \
6365 .currentsourcetransparent .currenttextknockout .currenttexturetransparent \
6366 .dashpath .dicttomark .discardtransparencygroup .discardtransparencymask \
6367 .endtransparencygroup .endtransparencymask .execn .filename .filename \
6368 .fileposition .forceput .forceundef .forgetsave .getbitsrect .getdevice \
6369 .inittransparencymask .knownget .locksafe .makeoperator .namestring .oserrno \
6370 .oserrorstring .peekstring .rectappend .runandhide .setaccuratecurves \
6371 .setblendmode .setcurvejoin .setdashadapt .setdebug .setdefaultmatrix \
6372 .setdotlength .setfilladjust2 .setlimitclamp .setmaxlength .setopacityalpha \
6373 .setoverprintmode .setrasterop .setsafe .setshapealpha .setsourcetransparent \
6374 .settextknockout .settexturetransparent .stringbreak .stringmatch .tempfile \
6375 .type1decrypt .type1encrypt .type1execchar .unread arccos arcsin copydevice \
6376 copyscanlines currentdevice finddevice findlibfile findprotodevice flushpage \
6377 getdeviceprops getenv makeimagedevice makewordimagedevice max min \
6378 putdeviceprops setdevice
6380 # PostScript styles
6382 # Braces are only matched in procedure parenthesis style
6383 braces.ps.style=11
6385 if PLAT_WIN
6386     command.go.*.ps=gswin32c "$(FileNameExt)"
6388 if PLAT_GTK
6389     command.go.*.ps=gs "$(FileNameExt)"
6394 ###############################################################################
6395 # From purebasic.properties
6396 # Define SciTE settings for PureBasic files.
6398 file.patterns.purebasic=*.pb
6400 filter.purebasic=PureBasic (pb)|$(file.patterns.purebasic)|
6402 *filter.purebasic=$(filter.purebasic)
6404 lexer.$(file.patterns.purebasic)=purebasic
6406 # keywords must be all lowercase
6408 #Language
6409 keywords.$(file.patterns.purebasic)=and break case continue data \
6410 datasection declare declarecdll declaredll default deftype dim else \
6411 elseif end enddatasection endenumeration endif endinterface endprocedure \
6412 endselect endstructure endstructureunion enumeration extends fakereturn \
6413 for foreach forever global gosub goto if includebinary includefile \
6414 includepath interface newlist next or procedure procedurecdll \
6415 proceduredll procedurereturn protected read repeat restore return select \
6416 shared static step structure structureunion to until wend while xincludefile
6418 #preprocessor
6419 keywords2.$(file.patterns.purebasic)=compilercase compilerdefault \
6420 compilerelse compilerendif compilerendselect compilerif compilerselect
6422 # PB styles
6423 # Preprocessor
6424 # Date
6425 # StringEOL
6426 # Asm
6431 ###############################################################################
6432 # From python.properties
6433 # Define SciTE settings for Python files.
6435 file.patterns.py=*.py;*.pyw;*.pyx;*.pxd;*.pxi
6436 file.patterns.scons=SConstruct;SConscript
6438 *source.patterns.python=$(file.patterns.py);
6440 shbang.python=py
6442 filter.python=Python (py pyw)|$(file.patterns.py)|
6444 *filter.python=$(filter.python)
6446 lexer.$(file.patterns.py)=python
6447 lexer.$(file.patterns.scons)=python
6449 *language.python=Pytho&n|py||
6451 keywordclass.python2=and as assert break class continue def del elif \
6452 else except exec finally for from global if import in is lambda not \
6453 or pass print raise return try while with yield
6455 keywordclass.python3=False None True and as assert break class continue \
6456 def del elif else except finally for from global if import in is lambda \
6457 nonlocal not or pass raise return try while with yield
6459 keywordclass.python=$(keywordclass.python2)
6461 # Extra keywords for cython
6462 keywordclass.cython=cdef cimport cpdef
6464 keywords.$(file.patterns.py)=$(keywordclass.python) $(keywordclass.cython)
6465 keywords.$(file.patterns.scons)=$(keywordclass.python)
6467 # If you uncomment the 3 lines below,
6468 # and put some words after "keywordclass2.python=",
6469 # those words will be styled by style.python.14
6471 #keywordclass2.python=
6472 #keywords2.$(file.patterns.py)=$(keywordclass2.python)
6473 #keywords2.$(file.patterns.scons)=$(keywordclass2.python)
6475 # Use 2 sets of substyles to highlight standard library modules and
6476 # imports from the future.
6477 # Additional identifier sets can be added by incrementing the  next
6478 # line's value and adding extra definitions similar to below.
6479 substyles.python.11=2
6481 substylewords.11.1.$(file.patterns.py)=\
6482 __main__ _dummy_thread _thread abc aifc argparse \
6483 array ast asynchat asyncio asyncore atexit audioop \
6484 base64 bdb binascii binhex bisect builtins bz2 \
6485 calendar cgi cgitb chunk cmath cmd code codecs \
6486 codeop collections colorsys compileall concurrent \
6487 configparser contextlib copy copyreg crypt csv \
6488 ctypes curses datetime dbm decimal difflib dis \
6489 distutils dummy_threading email ensurepip enum \
6490 errno faulthandler fcntl filecmp fileinput fnmatch \
6491 formatter fpectl fractions ftplib functools gc getopt \
6492 getpass gettext glob grp gzip hashlib heapq hmac \
6493 html http http imaplib imghdr importlib inspect io \
6494 ipaddress itertools json keyword linecache locale \
6495 logging lzma macpath mailbox mailcap marshal math \
6496 mimetypes mmap modulefinder msilib msvcrt \
6497 multiprocessing netrc nis nntplib numbers operator \
6498 os os ossaudiodev parser pathlib pdb pickle \
6499 pickletools pipes pkgutil platform plistlib poplib posix \
6500 pprint pty pwd py_compile pyclbr queue quopri \
6501 random re readline reprlib resource rlcompleter runpy \
6502 sched select selectors shelve shlex shutil signal site \
6503 smtpd smtplib sndhdr socket socketserver spwd \
6504 sqlite3 ssl stat statistics string stringprep struct \
6505 subprocess sunau symbol symtable sys sysconfig \
6506 syslog tabnanny tarfile telnetlib tempfile termios \
6507 textwrap threading time timeit tkinter token \
6508 tokenize trace traceback tracemalloc tty turtle \
6509 types unicodedata unittest urllib uu uuid venv warnings \
6510 wave weakref webbrowser winreg winsound wsgiref \
6511 xdrlib xml xmlrpc zipfile zipimport zlib
6512 style.python.11.1=fore:#DD9900
6514 substylewords.11.2.$(file.patterns.py)=__future__ \
6515 with_statement unicode_literals print_function
6516 style.python.11.2=fore:#EE00AA,italics
6518 #~ statement.indent.$(file.patterns.py)=10 :
6519 statement.indent.$(file.patterns.py)=5 class def elif else except finally \
6520 for if try while with
6522 statement.lookback.$(file.patterns.py)=0
6523 block.start.$(file.patterns.py)=
6524 block.end.$(file.patterns.py)=
6526 view.indentation.examine.*.py=2
6528 tab.timmy.whinge.level=1
6530 #fold.quotes.python=1
6532 comment.block.python=#~
6534 indent.python.colon=1
6536 # Python styles
6537 # Braces are only matched in operator style
6538 braces.python.style=10
6540 if PLAT_WIN
6541         command.go.*.py=pythonw -u "$(FileNameExt)"
6542         command.go.subsystem.*.py=1
6543         command.go.*.pyw=pythonw -u "$(FileNameExt)"
6544         command.go.subsystem.*.pyw=1
6545         command.build.SConscript=scons.bat --up .
6546         command.build.SConstruct=scons.bat .
6548 if PLAT_GTK
6549         command.go.*.py=python -u "$(FileNameExt)"
6550         command.build.SConscript=scons --up .
6551         command.build.SConstruct=scons .
6553 if PLAT_MAC
6554         command.go.*.py=python -u "$(FileNameExt)"
6555         command.build.SConscript=scons --up .
6556         command.build.SConstruct=scons .
6558 command.name.1.$(file.patterns.py)=Syntax Check
6559 command.1.$(file.patterns.py)=python -c "import py_compile; py_compile.compile(r'$(FilePath)')"
6563 ###############################################################################
6564 # From r.properties
6565 # Define SciTE settings for R and S source files
6567 file.patterns.r=*.R;*.rsource;*.S;
6568 file.patterns.r.like=$(file.patterns.r)
6570 filter.r=R and S+ (R S rsouce)|$(file.patterns.r)|
6572 *filter.r=$(filter.r)
6574 lexer.$(file.patterns.r)=r
6576 *language.r=R|R||
6578 keywordclass.r=if else repeat while function for in next break TRUE FALSE NULL NA Inf NaN
6580 keywords.$(file.patterns.r)=$(keywordclass.r)
6582 keywords2.$(file.patterns.r)=abbreviate abline abs acf acos acosh addmargins aggregate agrep alarm alias alist all anova any aov aperm append apply approx approxfun apropos ar args arima array arrows asin asinh assign assocplot atan atanh attach attr attributes autoload autoloader ave axis backsolve barplot basename beta bindtextdomain binomial biplot bitmap bmp body box boxplot bquote break browser builtins bxp by bzfile c call cancor capabilities casefold cat category cbind ccf ceiling character charmatch chartr chol choose chull citation class close cm cmdscale codes coef coefficients col colnames colors colorspaces colours comment complex confint conflicts contour contrasts contributors convolve cophenetic coplot cor cos cosh cov covratio cpgram crossprod cummax cummin cumprod cumsum curve cut cutree cycle data dataentry date dbeta dbinom dcauchy dchisq de debug debugger decompose delay deltat demo dendrapply density deparse deriv det detach determinant deviance dexp df dfbeta dfbetas dffits dgamma dgeom dget dhyper diag diff diffinv difftime digamma dim dimnames dir dirname dist dlnorm dlogis dmultinom dnbinom dnorm dotchart double dpois dput drop dsignrank dt dump dunif duplicated dweibull dwilcox eapply ecdf edit effects eigen emacs embed end environment eval evalq example exists exp expression factanal factor factorial family fft fifo file filter find fitted fivenum fix floor flush for force formals format formula forwardsolve fourfoldplot frame frequency ftable function gamma gaussian gc gcinfo gctorture get getenv geterrmessage gettext gettextf getwd gl glm globalenv gray grep grey grid gsub gzcon gzfile hat hatvalues hcl hclust head heatmap help hist history hsv httpclient iconv iconvlist identical identify if ifelse image influence inherits integer integrate interaction interactive intersect invisible isoreg jitter jpeg julian kappa kernapply kernel kmeans knots kronecker ksmooth labels lag lapply layout lbeta lchoose lcm legend length letters levels lfactorial lgamma library licence license line lines list lm load loadhistory loadings local locator loess log logb logical loglin lowess ls lsfit machine mad mahalanobis makepredictcall manova mapply match matlines matplot matpoints matrix max mean median medpolish menu merge message methods mget min missing mode monthplot months mosaicplot mtext mvfft names napredict naprint naresid nargs nchar ncol next nextn ngettext nlevels nlm nls noquote nrow numeric objects offset open optim optimise optimize options order ordered outer pacf page pairlist pairs palette par parse paste pbeta pbinom pbirthday pcauchy pchisq pdf pentagamma person persp pexp pf pgamma pgeom phyper pi pico pictex pie piechart pipe plclust plnorm plogis plot pmatch pmax pmin pnbinom png pnorm points poisson poly polygon polym polyroot postscript power ppoints ppois ppr prcomp predict preplot pretty princomp print prmatrix prod profile profiler proj promax prompt provide psigamma psignrank pt ptukey punif pweibull pwilcox q qbeta qbinom qbirthday qcauchy qchisq qexp qf qgamma qgeom qhyper qlnorm qlogis qnbinom qnorm qpois qqline qqnorm qqplot qr qsignrank qt qtukey quantile quarters quasi quasibinomial quasipoisson quit qunif quote qweibull qwilcox rainbow range rank raw rbeta rbind rbinom rcauchy rchisq readline real recover rect reformulate regexpr relevel remove reorder rep repeat replace replicate replications require reshape resid residuals restart return rev rexp rf rgamma rgb rgeom rhyper rle rlnorm rlogis rm rmultinom rnbinom rnorm round row rownames rowsum rpois rsignrank rstandard rstudent rt rug runif runmed rweibull rwilcox sample sapply save savehistory scale scan screen screeplot sd search searchpaths seek segments seq sequence serialize setdiff setequal setwd shell sign signif sin single sinh sink smooth solve sort source spectrum spline splinefun split sprintf sqrt stack stars start stderr stdin stdout stem step stepfun stl stop stopifnot str strftime strheight stripchart strptime strsplit strtrim structure strwidth strwrap sub subset substitute substr substring sum summary sunflowerplot supsmu svd sweep switch symbols symnum system t table tabulate tail tan tanh tapply tempdir tempfile termplot terms tetragamma text time title toeplitz tolower topenv toupper trace traceback transform trigamma trunc truncate try ts tsdiag tsp typeof unclass undebug union unique uniroot unix unlink unlist unname unserialize unsplit unstack untrace unz update upgrade url var varimax vcov vector version vi vignette warning warnings weekdays weights which while window windows with write wsbrowser xedit xemacs xfig xinch xor xtabs xyinch yinch zapsmall
6584 keywords3.$(file.patterns.r)=acme aids aircondit amis aml banking barchart barley beaver bigcity boot brambles breslow bs bwplot calcium cane capability cav censboot channing city claridge cloth cloud coal condense contourplot control corr darwin densityplot dogs dotplot ducks empinf envelope environmental ethanol fir frets gpar grav gravity grob hirose histogram islay knn larrows levelplot llines logit lpoints lsegments lset ltext lvqinit lvqtest manaus melanoma melanoma motor multiedit neuro nitrofen nodal ns nuclear oneway parallel paulsen poisons polar qq qqmath remission rfs saddle salinity shingle simplex singer somgrid splom stripplot survival tau tmd tsboot tuna unit urine viewport wireframe wool xyplot
6587 word.chars.r=$(chars.alpha)$(chars.numeric)_.#
6588 word.characters.$(file.patterns.r)=$(word.chars.r)
6589 comment.block.r=#~
6591 statement.indent.$(file.patterns.r.like)=5 for if
6592 statement.end.$(file.patterns.r.like)=10 ;
6593 statement.lookback.$(file.patterns.r.like)=20
6594 block.start.$(file.patterns.r.like)=10 {
6595 block.end.$(file.patterns.r.like)=10 }
6597 # R styles
6600 # Braces are only matched in operator style
6601 braces.r.style=8
6605 ###############################################################################
6606 # From rebol.properties
6607 # Define SciTE settings for REBOL files.
6609 file.patterns.rebol=*.r;*.reb
6611 filter.rebol=REBOL (r)|$(file.patterns.rebol)|
6613 *filter.rebol=$(filter.rebol)
6615 lexer.$(file.patterns.rebol)=rebol
6617 # keywords. Found at http://www.rebol.com/docs/dictionary.html
6618 keywords.$(file.patterns.rebol)=about abs absolute add \
6619 alert alias all alter and \
6620 any any-block? any-function? any-string? any-type? \
6621 any-word? append arccosine arcsine arctangent \
6622 array as-pair ask at attempt \
6623 back binary? bind bitset? block? \
6624 break brightness? browse build-tag caret-to-offset \
6625 catch center-face change change-dir char? \
6626 charset checksum choose clean-path clear \
6627 clear-fields close comment complement component? \
6628 compose compress confirm connected? construct \
6629 context copy cosine datatype? date? \
6630 debase decimal? decode-cgi decompress dehex \
6631 delete detab difference dir? dirize \
6632 disarm dispatch divide do do-events \
6633 does dump-face dump-obj echo either \
6634 else email? empty? enbase entab \
6635 equal? error? even? event? exclude \
6636 exists? exit exp extract fifth \
6637 file? find first flash focus \
6638 for forall foreach forever form \
6639 forskip found? fourth free func \
6640 function function? get get-modes get-word? \
6641 greater-or-equal? greater? halt has hash? \
6642 head head? help hide hide-popup \
6643 if image? import-email in in-window? \
6644 index? info? inform input input? \
6645 insert integer? intersect issue? join \
6646 last launch layout length? lesser-or-equal? \
6647 lesser? library? license link? list-dir \
6648 list? lit-path? lit-word? load load-image \
6649 log-10 log-2 log-e logic? loop \
6650 lowercase make make-dir make-face max \
6651 maximum maximum-of min minimum minimum-of \
6652 modified? mold money? multiply native? \
6653 negate negative? next none? not \
6654 not-equal? now number? object? odd? \
6655 offset-to-caret offset? op? open or \
6656 pair? paren? parse parse-xml path? \
6657 pick poke port? positive? power \
6658 prin print probe protect protect-system \
6659 query quit random read read-io \
6660 recycle reduce refinement? reform rejoin \
6661 remainder remold remove remove-each rename \
6662 repeat repend replace request request-color \
6663 request-date request-download request-file request-list request-pass \
6664 request-text resend return reverse routine? \
6665 same? save script? second secure \
6666 select send series? set set-modes \
6667 set-net set-path? set-word? show show-popup \
6668 sign? sine size-text size? skip \
6669 sort source span? split-path square-root \
6670 strict-equal? strict-not-equal? string? struct? stylize \
6671 subtract suffix? switch tag? tail \
6672 tail? tangent third throw time? \
6673 to to-binary to-bitset to-block to-char \
6674 to-date to-decimal to-email to-file to-get-word \
6675 to-hash to-hex to-idate to-image to-integer \
6676 to-issue to-list to-lit-path to-lit-word to-local-file \
6677 to-logic to-money to-pair to-paren to-path \
6678 to-rebol-file to-refinement to-set-path to-set-word to-string \
6679 to-tag to-time to-tuple to-url to-word \
6680 trace trim try tuple? type? \
6681 unfocus union unique unprotect unset \
6682 unset? until unview update upgrade \
6683 uppercase url? usage use value? \
6684 view viewed? wait what what-dir \
6685 while within? word? write write-io xor zero?
6687 # test functions
6688 keywords2.$(file.patterns.rebol)=action? any-block? any-function? any-string? \
6689 any-type? any-word? binary? bitset? block? char? component? connected? \
6690 datatype? date? decimal? dir? email? empty? equal? error? even? event? exists? \
6691 file? found? function? get-word? greater-or-equal greater? hash? head? image? \
6692 index? info? input? integer? issue? length? lesser-or-equal? lesser? library? \
6693 link-app? link? list? lit-path? lit-word? logic? modified? money? native? negative? \
6694 none? not-equal? number? object? odd? offset? op? pair? paren? path? port? \
6695 positive? rebol-command? rebol-encap? rebol-link? rebol-pro? rebol-view? \
6696 refinement? routine? same? script? series? set-path? set-word? sign? size? \
6697 strict-equal? strict-not-equal string? struct? suffix? tag? tail? time? tuple? type? \
6698 unset? url? value? view? word? zero?
6700 # types
6701 keywords3.$(file.patterns.rebol)=action! any-block! any-function! any-string! any-type! \
6702  any-word! binary! bitset! block! char! datatype! date! decimal! email! error! \
6703  event! file! function! get-word! hash! image! integer! issue! library! list! lit-path! \
6704  lit-word! logic! money! native! none! number! object! op! pair! paren! path! \
6705  port! refinement! routine! series! set-path! set-word! string! struct! symbol! tag! \
6706  time! tuple! unset! url! word!
6708 word.chars.rebol=$(chars.alpha)$(chars.numeric)?!.’+-*&|=_~
6709 word.characters.$(file.patterns.rebol)=$(word.chars.rebol)
6711 comment.block.rebol=;
6712 comment.box.start.rebol=;;
6713 comment.box.middle.rebol=;;
6714 comment.box.end.rebol=;;
6716 # REBOL styles
6720 # Braces are only matched in default style
6721 braces.rebol.style=0
6723 command.go.$(file.patterns.rebol)=E:\tools\lang\rebol\core\rebol.exe $(FilePath)
6728 ###############################################################################
6729 # From registry.properties
6730 # Define SciTE settings for registry files.
6732 file.patterns.registry=*.reg
6733 filter.registry=Registration files (reg)|$(file.patterns.registry)|
6734 lexer.$(file.patterns.registry)=registry
6736 comment.block.registry=;;
6738 [Styles]
6743 ###############################################################################
6744 # From ruby.properties
6745 # Define SciTE settings for Ruby files.
6747 file.patterns.rb=*.rb;*.rbw;*.rake;*.rjs;Rakefile
6749 *source.patterns.ruby=$(file.patterns.rb);
6751 shbang.ruby=rb
6753 filter.ruby=Ruby (rb rbw)|$(file.patterns.rb)|
6755 *filter.ruby=$(filter.ruby)
6757 lexer.$(file.patterns.rb)=ruby
6759 *language.ruby=Ruby|rb||
6761 keywordclass.ruby=__FILE__ and def end in or self unless __LINE__ begin \
6762 defined? ensure module redo super until BEGIN break do false next rescue \
6763 then when END case else for nil retry true while alias class elsif if \
6764 not return undef yield
6765 keywords.$(file.patterns.rb)=$(keywordclass.ruby)
6767 statement.indent.$(file.patterns.rb)=5 def class if do elsif else case while for
6769 block.start.$(file.patterns.rb)=5 do
6770 block.end.$(file.patterns.rb)=5 end
6772 indent.opening.$(file.patterns.rb)=1
6773 indent.closing.$(file.patterns.rb)=1
6775 comment.block.ruby=#~
6777 # ruby styles
6779 # Braces are only matched in operator style
6780 braces.ruby.style=10
6782 if PLAT_WIN
6783         command.go.*.rb=ruby $(FileNameExt)
6784         command.go.subsystem.*.rb=1
6785         command.go.*.rbw=rubyw $(FileNameExt)
6786         command.go.subsystem.*.rbw=1
6787         command.help.*.rb=$(CurrentWord)!c:\apps\ruby\ProgrammingRuby.chm
6788         command.help.subsystem.*.rb=4
6790 if PLAT_GTK
6791         command.go.*.rb=ruby $(FileNameExt)
6793         command.name.1.*.rb=Check Syntax
6794         command.1.*.rb=ruby -cw $(FileNameExt)
6796         command.name.2.*.rb=Code Profiler
6797         command.2.*.rb=ruby -r profile $(FileNameExt)
6799 if PLAT_MAC
6800         command.go.*.rb=ruby $(FileNameExt)
6801         command.name.1.*.rb=Check Syntax
6802         command.1.*.rb=ruby -cw $(FileNameExt)
6803         command.name.2.*.rb=Code Profiler
6804         command.2.*.rb=ruby -r profile $(FileNameExt)
6808 ###############################################################################
6809 # From rust.properties
6810 # Define SciTE settings for Rust
6812 file.patterns.rust=*.rs
6813 filter.rust=Rust (rs)|$(file.patterns.rust)|
6814 *filter.rust=$(filter.rust)
6815 lexer.$(file.patterns.rust)=rust
6816 *language.rust=Rust|rs||
6818 word.chars.rust=$(chars.alpha)$(chars.numeric)_#
6819 word.characters.$(file.patterns.rust)=$(word.chars.rust)
6820 calltip.rust.word.characters=$(chars.alpha)$(chars.numeric)_
6822 comment.block.at.line.start.rust=1
6823 comment.block.rust=//~
6824 comment.stream.start.rust=/*
6825 comment.stream.end.rust=*/
6826 comment.box.start.rust=/*
6827 comment.box.middle.rust= *
6828 comment.box.end.rust= */
6830 statement.indent.$(file.patterns.rust)=6
6831 statement.end.$(file.patterns.rust)=16 ;
6832 statement.lookback.$(file.patterns.rust)=20
6833 block.start.$(file.patterns.rust)=16 {
6834 block.end.$(file.patterns.rust)=16 }
6835 braces.rust.style=16
6837 # Rust keywords
6838 keywords.$(file.patterns.rust)=alignof as be box break const continue crate do else enum extern false fn for if impl in let loop match mod mut offsetof once priv proc pub pure ref return self sizeof static struct super trait true type typeof unsafe unsized use virtual while yield
6840 # Built-in types
6841 keywords2.$(file.patterns.rust)=bool char f32 f64 i16 i32 i64 i8 int str u16 u32 u64 u8 uint
6843 # The Self parameter
6844 keywords3.$(file.patterns.rust)=Self
6847 command.compile.*.rs=rustc $(FileNameExt)
6848 command.build.*.rs=$(make.command)
6849 command.go.*.rs=./$(FileName)
6854 ###############################################################################
6855 # From scriptol.properties
6856 # Define SciTE settings for scriptol files.
6858 filter.scriptol=Scriptol (sol)|*.sol|
6860 *filter.scriptol=$(filter.scriptol)
6862 lexer.*.sol=scriptol
6864 file.patterns.sol=*.sol
6866 keywordclass.scriptol= act action alias always and array as \
6867 bool boolean break by byte \
6868 class case catch const constant continue \
6869 dyn def define dict do double \
6870 echo else elsif end enum error false file for float forever function \
6871 globak gtk \
6872 in if ifdef import include int integer java javax \
6873 let long match mod nil not natural null number \
6874 or print protected public real return redo \
6875 scan script scriptol sol short super static step until using \
6876 var text then this true try \
6877 void volatile while when \
6878 undef zero
6879 keywords.$(file.patterns.sol)=$(keywordclass.scriptol)
6881 statement.indent.*.sol=
6882 statement.lookback.*.sol=1
6883 block.start.*.sol=10
6885 comment.block.scriptol=`~
6887 # scriptol styles
6890 if PLAT_WIN
6891         command.help.$(file.patterns.sol)="file://$(SciteDefaultHome)\manual.html"
6892         command.help.subsystem.$(file.patterns.sol)=2
6894 if PLAT_GTK
6895         command.help.$(file.patterns.sol)=man $(CurrentWord) | col -b
6897 command.compile.*.sol=solc -c $(FileNameExt)
6898 command.build.*.sol=solc -be $(FileNameExt)
6899 command.go.*.sol=$(FileName)
6900 command.go.subsystem.*.sol=1
6902 command.name.0.*.sol=XSolP
6903 command.0.*.sol =xsolp -be $(FileNameExt)
6904 command.is.filter.0.*.sol=1
6906 command.name.1.*.sol=XSolC
6907 command.1.*.sol =xsolc -be $(FileNameExt)
6908 command.is.filter.1.*.sol=1
6910 command.name.2.*.sol=Compile to Php
6911 command.2.*.sol=solp -b $(FileNameExt)
6912 command.is.filter.2.*.sol=1
6914 command.name.3.*.sol=Compile Web page
6915 command.3.*.sol=solp -b -w $(FileNameExt)
6916 command.is.filter.3.*.sol=1
6918 command.name.4.*.sol=Interpret
6919 command.4.*.sol=solp $(FileNameExt)
6920 command.is.filter.4.*.sol=1
6925 ###############################################################################
6926 # From smalltalk.properties
6927 # Define SciTE settings for Smalltalk files.
6929 file.patterns.smalltalk=*.st
6931 filter.smalltalk=Smalltalk (st)|$(file.patterns.smalltalk)|
6933 *filter.smalltalk=$(filter.smalltalk)
6935 lexer.$(file.patterns.smalltalk)=smalltalk
6937 keywords.$(file.patterns.smalltalk)=\
6938     ifTrue: ifFalse: whileTrue: whileFalse: ifNil: ifNotNil: whileTrue whileFalse repeat isNil notNil
6940 # Styles
6945 ###############################################################################
6946 # From sorcins.properties
6947 # Define SciTE settings for SORCUS Installation Files
6948 # Originally by Christoph Baumann cb@sorcus.com
6950 # SORCUS Installation files end with .ins
6951 file.patterns.sorcins=*.ins
6952 filter.sorcins=SORCUS Installation File (ins)|$(file.patterns.sorcins)|
6954 *filter.sorcins=$(filter.sorcins)
6956 lexer.$(file.patterns.sorcins)=sorcins
6958 commands=ARGUSCONNECTCHANNELS \
6959     M2DEVICE M2INST M2PAR M2PROC M2FUNC M2CMD M2LOADMODUL \
6960     M6DEVICE M6INST M6PAR M6PROC M6FUNC M6CMD M6LOADMODUL \
6961     M7DEVICE M7INST M7PAR M7PROC M7FUNC M7CMD M7LOADMODUL \
6962     M8DEVICE M8INST M8PAR M8PROC M8FUNC M8CMD M8LOADMODUL \
6963     MAXRESET MAXCONNECTCPU MAXLOADOSX MAXINST MAXPROC \
6964     MAXFUNC MAXPAR MAXLOADMDD MAXFLASHFILE
6966 parameter=board slot layer osx file no usage task tasktype level irq flags \
6967     datasize func para start progno name count index TIMEOUT RESET
6969 constants=MAX_NI_TASK MAX_TI_TASK MAX_II_TASK MAX_DI_TASK
6971 keywords.$(file.patterns.sorcins)=$(commands)
6972 keywords2.$(file.patterns.sorcins)=$(parameter)
6973 keywords3.$(file.patterns.sorcins)=$(constants)
6975 comment.block.sorcins=;
6980 ###############################################################################
6981 # From specman.properties
6982 # Define SciTE settings for Specman E language files.
6984 # specman files
6985 file.patterns.specman=*.e
6987 filter.specman=Specman (e)|\
6988 $(file.patterns.specman)|
6990 *filter.specman=$(filter.specman)
6992 lexer.$(file.patterns.specman)=specman
6994 *language.specman=Specman|e||
6996 keywords.$(file.patterns.specman)= \
6997 struct unit \
6998 integer real bool int long uint nibble byte bits bytes bit time string \
6999 var instance event \
7000 verilog vhdl \
7001 on compute start expect check that routine \
7002 specman is also first only with like \
7003 list of all radix hex dec bin ignore illegal \
7004 traceable untraceable \
7005 cover using count_only trace_only at_least transition item ranges \
7006 cross text call task within \
7007 packing low high \
7008 locker address \
7009 body code vec chars \
7010 byte_array external_pointer \
7011 choose matches \
7012 if then else when try \
7013 case casex casez default \
7014 and or not xor \
7015 until repeat while for from to step each do break continue \
7016 before next always -kind network \
7017 index it me in new return result select \
7018 cycle sample events forever \
7019 wait  change  negedge rise fall delay sync sim true detach eventually emit \
7020 gen keep keeping soft before \
7021 define as computed type extend \
7022 variable global sys \
7023 import \
7024 untyped symtab ECHO DOECHO \
7025 initialize non_terminal testgroup delayed exit finish \
7026 out append print outf appendf \
7027 post_generate pre_generate setup_test finalize_test extract_test \
7028 init run copy as_a a set_config dut_error add clear lock quit \
7029 lock unlock release swap quit to_string value stop_run \
7030 crc_8 crc_32 crc_32_flip get_config add0 all_indices and_all \
7031 apply average count delete exists first_index get_indices \
7032 has insert is_a_permutation is_empty key key_exists key_index \
7033 last last_index max max_index max_value min min_index \
7034 min_value or_all pop pop0 push push0 product resize reverse \
7035 sort split sum top top0 unique clear is_all_iterations \
7036 get_enclosing_unit hdl_path exec deep_compare deep_compare_physical \
7037 pack unpack warning error fatal \
7038 size \
7039 files load module ntv source_ref script read write \
7040 initial idle others posedge clock cycles \
7041 statement action command member exp block num file
7043 # keywords2 is for highlighting secondary keywords
7044 keywords2.$(file.patterns.specman)= \
7045 TRUE FALSE \
7046 MAX_INT MIN_INT NULL UNDEF \
7048 # keywords3 is for sequence and eRM keywords and functions
7049 keywords3.$(file.patterns.specman)= \
7050 any_sequence_item sequence any_sequence_driver driver \
7051 created_driver  parent_sequence \
7052 bfm_interaction_mode PULL_MODE PUSH_MODE MAIN SIMPLE RANDOM \
7053 max_random_count max_random_depth num_of_last_items \
7054 NORMAL NONE FULL LOW HIGH MEDIUM logger message \
7055 get_tags show_units show_actions show_message ignore_tags \
7056 set_style set_screen set_file set_flush_frequency \
7057 set_format set_units set_actions at_message_verbosity \
7058 short_name short_name_path short_name_style \
7060 private protected package rerun any_env \
7061 unqualified_clk clk reset_start reset_end \
7062 message_logger verbosity tags to_file \
7064 body pre_body post_body get_next_item send_to_bfm \
7065 get_depth get_driver nice_string get_index grab \
7066 is_blocked is_relevant ungrab mid_do post_do post_trace \
7067 pre_do current_grabber get_current_item get_num_items_sent \
7068 get_sequence_trace_list get_trace_list is_grabbed \
7069 try_next_item check_is_relevant delay_clock \
7070 get_sub_drivers regenerate_data wait_for_sequences \
7071 stop
7073 # keywords4 is for highlighting user defined keywords or function calls, highlighted in style 19
7074 keywords4.$(file.patterns.specman)=
7076 word.chars.specman=$(chars.alpha)$(chars.numeric)_#
7077 word.characters.$(file.patterns.specman)=$(word.chars.specman)
7078 comment.block.specman=//~
7079 comment.block.at.line.start.specman=1
7080 comment.stream.start.specman=
7081 comment.stream.end.specman=
7082 comment.box.start.specman=
7083 comment.box.middle.specman=
7084 comment.box.end.specman=
7086 #~ statement.indent.$(file.patterns.specman)=5  if else try \
7087 #~ case casex casez default \
7088 #~ until repeat while for do \
7089 #~ struct unit extend when
7090 #~ statement.lookback.$(file.patterns.specman)=20
7091 #~ block.start.$(file.patterns.specman)=10 {
7092 #~ block.end.$(file.patterns.specman)=10 }
7094 indent.maintain.$(file.patterns.specman)=1;
7096 #autocomplete.specman.fillups=(
7098 preprocessor.symbol.$(file.patterns.specman)=#
7099 preprocessor.start.$(file.patterns.specman)=ifdef ifndef
7100 preprocessor.middle.$(file.patterns.specman)=else
7101 preprocessor.end.$(file.patterns.specman)=}
7104 # Specman E styles
7107 # Braces are only matched in operator style
7108 braces.specman.style=10
7113 ###############################################################################
7114 # From spice.properties
7115 # Define SciTE settings for spice files.
7117 file.patterns.spice=*.scp;*.out
7118 filter.spice=Spice (out scp)|$(file.patterns.spice)|
7119 *filter.spice=$(filter.spice)
7120 lexer.$(file.patterns.spice)=spice
7122 #indent.size.$(file.patterns.spice)=3
7123 #use.tabs.$(file.patterns.spice)=0
7125 # Keyword for script commands
7126 keywordclass.spice.command=\
7127 ac  alias  alter  alterparam append askvalues assertvalid autoscale \
7128 break compose copy copytodoc dc  delete  destroy  destroyvec diff  display \
7129 disto  dowhile  echo  else  end  errorstop  fftinit filter foreach  fourier \
7130 freqtotime function  functionundef goto  homecursors if isdisplayed label \
7131 let  linearize listing  load  loadaccumulator makelabel movelabel makesmithplot \
7132 movecursorleft movecursorright  msgbox nameplot  newplot nextparam noise \
7133 nopoints  op plot plotf plotref poly print  printcursors  printevent printname \
7134 printplot printstatus printtext printtol printunits printval printvector \
7135 pwl  pz  quit  removesmithplot rename repeat  resume  rotate  runs rusage \
7136 save sendplot sendscript sens  set  setcursor setdoc setlabel setlabeltype \
7137 setmargins setnthtrigger  setunits setvec setparam setplot  setquery \
7138 setscaletype settracecolor settracestyle setsource settrigger  setvec \
7139 setxlimits setylimits show  showmod  sort status  step  stop  switch \
7140 tf  timetofreq  timetowave tran  unalias  unlet  unset  unalterparam \
7141 update version view   wavefilter  wavetotime where  while  write
7142 # Keywords for script functions
7143 keywordclass.spice.functions=\
7144 abs askvalue atan average ceil cos db differentiate differentiatex \
7145 exp finalvalue floor getcursorx getcursory getcursory0 getcursory1 \
7146 getparam im ln initialvalue integrate integratex interpolate isdef \
7147 isdisplayed j log length mag, max maxscale mean meanpts min minscale \
7148 nextplot  nextvector  norm operatingpoint ph phase phaseextend pk_pk \
7149 pos pulse re rms rmspts rnd sameplot  sin sqrt stddev stddevpts tan \
7150 tfall tolerance trise unitvec vector
7151 # Keywords for spice parameters
7152 keywordclass.spice.params=param nodeset include options dcconv subckt ends model
7155 keywordclass.spice=$(keywordclass.spice.command) $(keywordclass.spice.functions) $(keywordclass.spice.params)
7157 keywords.$(file.patterns.spice)=$(keywordclass.spice.command)
7158 keywords2.$(file.patterns.spice)=$(keywordclass.spice.functions)
7159 keywords3.$(file.patterns.spice)=$(keywordclass.spice.params)
7161 # spice styles
7163 # Comments
7164 comment.block.spice=*~
7166 braces.spice.style=4
7168 statement.indent.$(file.patterns.spice)=5 begin declare else elsif exception for if is loop while
7169 statement.lookback.$(file.patterns.spice)=20
7170 block.start.$(file.patterns.spice)=10 then is
7171 block.end.$(file.patterns.spice)=10 end
7173 calltip.spice.word.characters=._$(chars.alpha)
7177 ###############################################################################
7178 # From sql.properties
7179 # Define SciTE settings for SQL and PL/SQL files.
7181 filter.sql=SQL (sql)|*.sql|
7183 *filter.sql=$(filter.sql)
7185 file.patterns.sql=*.sql
7186 file.patterns.plsql=*.spec;*.body;*.sps;*.spb;*.sf;*.sp
7188 lexer.$(file.patterns.sql)=sql
7189 lexer.$(file.patterns.plsql)=sql
7191 *language.sql=S&QL|sql||
7193 #*language.plsql=P&LSQL|spec||
7195 # SQL styles
7196 # Not used
7197 # not used
7198 # style.sql.14=
7200 # Braces are only matched in operator style
7201 braces.sql.style=10
7202 # Enables backslash as an escape character
7203 #sql.backslash.escapes=1
7205 # Activate '#' based comments for MySQL with 1 or disable for Oracle with 0:
7206 #lexer.sql.numbersign.comment=0
7208 # Set to 1 to colourise recognized words with dots
7209 # (recommended for Oracle PL/SQL objects)
7210 #lexer.sql.allow.dotted.word=1
7212 #lexer.sql.backticks.identifier=1
7214 keywords.$(file.patterns.sql)=\
7215 absolute action add admin after aggregate \
7216 alias all allocate alter and any are array as asc \
7217 assertion at authorization \
7218 before begin binary bit blob body boolean both breadth by \
7219 call cascade cascaded case cast catalog char character \
7220 check class clob close collate collation column commit \
7221 completion connect connection constraint constraints \
7222 constructor continue corresponding create cross cube current \
7223 current_date current_path current_role current_time current_timestamp \
7224 current_user cursor cycle \
7225 data date day deallocate dec decimal declare default \
7226 deferrable deferred delete depth deref desc describe descriptor \
7227 destroy destructor deterministic dictionary diagnostics disconnect \
7228 distinct domain double drop dynamic \
7229 each else end end-exec equals escape every except \
7230 exception exec execute exists exit external \
7231 false fetch first float for foreign found from free full \
7232 function \
7233 general get global go goto grant group grouping \
7234 having host hour \
7235 identity if ignore immediate in indicator initialize initially \
7236 inner inout input insert int integer intersect interval \
7237 into is isolation iterate \
7238 join \
7239 key \
7240 language large last lateral leading left less level like \
7241 limit local localtime localtimestamp locator \
7242 map match merge minute modifies modify module month \
7243 names national natural nchar nclob new next no none \
7244 not null numeric \
7245 object of off old on only open operation option \
7246 or order ordinality out outer output \
7247 package pad parameter parameters partial path postfix precision prefix \
7248 preorder prepare preserve primary \
7249 prior privileges procedure public \
7250 read reads real recursive ref references referencing relative \
7251 restrict result return returns revoke right \
7252 role rollback rollup routine row rows \
7253 savepoint schema scroll scope search second section select \
7254 sequence session session_user set sets size smallint some| space \
7255 specific specifictype sql sqlexception sqlstate sqlwarning start \
7256 state statement static structure system_user \
7257 table temporary terminate than then time timestamp \
7258 timezone_hour timezone_minute to trailing transaction translation \
7259 treat trigger true \
7260 under union unique unknown \
7261 unnest update usage user using \
7262 value values varchar variable varying view \
7263 when whenever where with without work write \
7264 year \
7265 zone
7267 keywords.$(file.patterns.plsql)=\
7268 all alter and any array as asc at authid avg begin between \
7269 binary_integer \
7270 body boolean bulk by char char_base check close cluster collect \
7271 comment commit compress connect constant create current currval \
7272 cursor date day declare decimal default delete desc distinct \
7273 do drop else elsif end exception exclusive execute exists exit \
7274 extends false fetch float for forall from function goto group \
7275 having heap hour if immediate in index indicator insert integer \
7276 interface intersect interval into is isolation java level like \
7277 limited lock long loop max min minus minute mlslabel mod mode \
7278 month natural naturaln new nextval nocopy not nowait null number \
7279 number_base ocirowid of on opaque open operator option or order \
7280 organization others out package partition pctfree pls_integer \
7281 positive positiven pragma prior private procedure public raise \
7282 range raw real record ref release return reverse rollback row \
7283 rowid rownum rowtype savepoint second select separate set share \
7284 smallint space sql sqlcode sqlerrm start stddev subtype successful \
7285 sum synonym sysdate table then time timestamp to trigger true \
7286 type uid union unique update use user validate values varchar \
7287 varchar2 variance view when whenever where while with work write \
7288 year zone
7290 # Keywords for PlDoc comments
7291 keywords3.$(file.patterns.sql)=\
7292 param author since return see deprecated todo
7294 # Keywords for SQL*Plus
7295 keywords4.$(file.patterns.sql)=\
7296 acc~ept a~ppend archive log attribute \
7297 bre~ak bti~tle \
7298 c~hange cl~ear col~umn comp~ute conn~ect copy \
7299 def~ine del desc~ribe disc~onnect \
7300 e~dit exec~ute exit \
7301 get \
7302 help ho~st \
7303 i~nput \
7304 l~ist \
7305 passw~ord pau~se pri~nt pro~mpt \
7306 quit \
7307 recover rem~ark repf~ooter reph~eader r~un \
7308 sav~e set sho~w shutdown spo~ol sta~rt startup store \
7309 timi~ng tti~tle \
7310 undef~ine \
7311 var~iable \
7312 whenever oserror whenever sqlerror \
7314 # User keywords 1
7315 # Keywords for Standard packages
7316 keywords5.$(file.patterns.sql)=\
7317 dbms_output.disable dbms_output.enable dbms_output.get_line \
7318 dbms_output.get_lines dbms_output.new_line dbms_output.put \
7319 dbms_output.put_line \
7323 ###############################################################################
7324 # From tacl.properties
7325 # Define SciTE settings for TACL files.
7327 file.patterns.TACL=*.tacl
7328 filter.tacl=TACL (TACL)|$(file.patterns.TACL)|
7329 *filter.tacl=$(filter.tacl)
7331 lexer.$(file.patterns.TACL)=TACL
7333 # These keywords are case insensitive
7334 keywords.$(file.patterns.TACL)=activate add adddsttransition adduser alter altpri assign attachseg backupcpu break builtins buscmd clear columnize comment compute copy dump copyvar create createseg debug debugnow default delete deluser detachseg env exit fileinfo filenames files filetovar help history home info initterm inlecho inleof inlout inlprefix inlto join keep keys lights load loaded files logoff logon o obey outvar param password pause pmsearch pmsg pop ppd purge push rcvdump receivedump reload remotepassword rename reset rpasswrd run rund seginfo set setprompt settime show sink status stop suspend switch system systimes time timestamp_to_text useusers variables varinfo vartofile vchange vcopy vdelete vfind vinsert vlist vmove volume vtree wakeup who xbusdown xbusup ybusdown ybusup _comparev _contime_to_text _contime_to_text_date _contime_to_text_time _debugger _execute _longest _month3
7336 comment.block.TACL===
7338 # TACL styles
7339 # 1,Comment|2,Line Comment|3,Doc Comment|4,Number|5,Builtin|6,String|7,Character|8,Command|9,Preprocessor|10,Operator
7346 ###############################################################################
7347 # From tal.properties
7348 # Define SciTE settings for TAL files.
7349 file.patterns.TAL=*.TAL
7350 filter.tal=TAL (TAL)|$(file.patterns.TAL)|
7351 *filter.tal=$(filter.tal)
7353 lexer.$(file.patterns.TAL)=TAL
7355 # These keywords are case insensitive
7356 keywords.$(file.patterns.TAL)=and assert baddr begin by call callable case cbaddr code cwaddr define do downto drop else end entry external fixed for forward goto if int interrupt label land literal lor main not of or otherwise priv proc procaddr real resident return rscan scan sgbaddr sgwaddr sgxbaddr sgxwaddr stack store string struct subproc then to unsigned until use variable waddr while xor
7357 keywords2.$(file.patterns.TAL)=at below bit_filler block bytes c cobol elements ext extensible filler fortran language name pascal private unspecified words
7359 comment.block.TAL=--
7361 # TAL styles
7362 # 1,Comment|2,Line Comment|3,Doc Comment|4,Number|5,Keyword|6,String|7,Character|8,Unreserved keyword|9,Preprocessor|10,Operator
7370 ###############################################################################
7371 # From tcl.properties
7372 # Define SciTE settings for tcl and itcl files.
7374 file.patterns.tcl=*.tcl;*.exp
7375 file.patterns.itcl=*.itcl
7376 file.patterns.tcl.like=$(file.patterns.tcl);$(file.patterns.itcl);
7378 filter.tcl=Tcl (tcl)|$(file.patterns.tcl)|
7379 filter.itcl=itcl (itcl)|$(file.patterns.itcl)|
7381 *filter.tcl=$(filter.tcl)
7383 lexer.$(file.patterns.tcl)=tcl
7384 lexer.$(file.patterns.itcl)=tcl
7386 *language.tcl=&TCL|tcl||
7388 keywordclass.tcl=after append array auto_execok \
7389 auto_import auto_load auto_load_index auto_qualify \
7390 beep bgerror binary break case catch cd clock \
7391 close concat continue dde default echo else elseif \
7392 encoding eof error eval exec exit expr fblocked \
7393 fconfigure fcopy file fileevent flush for foreach format \
7394 gets glob global history http if incr info \
7395 interp join lappend lindex linsert list llength load \
7396 loadTk lrange lreplace lsearch lset lsort memory msgcat \
7397 namespace open package pid pkg::create pkg_mkIndex Platform-specific proc \
7398 puts pwd re_syntax read regexp registry regsub rename \
7399 resource return scan seek set socket source split \
7400 string subst switch tclLog tclMacPkgSearch tclPkgSetup tclPkgUnknown tell \
7401 time trace unknown unset update uplevel upvar variable \
7402 vwait while
7404 keywordclass.tk=bell bind bindtags bitmap button canvas checkbutton clipboard \
7405 colors console cursors destroy entry event focus font \
7406 frame grab grid image Inter-client keysyms label labelframe \
7407 listbox lower menu menubutton message option options pack \
7408 panedwindow photo place radiobutton raise scale scrollbar selection \
7409 send spinbox text tk tk_chooseColor tk_chooseDirectory tk_dialog tk_focusNext \
7410 tk_getOpenFile tk_messageBox tk_optionMenu tk_popup tk_setPalette tkerror tkvars tkwait \
7411 toplevel winfo wish wm
7413 keywordclass.itcl=@scope body class code common component configbody \
7414 constructor define destructor hull import inherit itcl itk itk_component \
7415 itk_initialize itk_interior itk_option iwidgets keep method \
7416 private protected public
7418 keywordclass.TkCommands=tk_bisque tk_chooseColor tk_dialog tk_focusFollowsMouse tk_focusNext \
7419 tk_focusPrev tk_getOpenFile tk_getSaveFile tk_messageBox tk_optionMenu \
7420 tk_popup tk_setPalette tk_textCopy tk_textCut tk_textPaste \
7421 tkButtonAutoInvoke tkButtonDown tkButtonEnter tkButtonInvoke tkButtonLeave \
7422 tkButtonUp tkCancelRepeat tkCheckRadioDown tkCheckRadioEnter tkCheckRadioInvoke \
7423 tkColorDialog tkColorDialog_BuildDialog tkColorDialog_CancelCmd tkColorDialog_Config tkColorDialog_CreateSelector \
7424 tkColorDialog_DrawColorScale tkColorDialog_EnterColorBar tkColorDialog_HandleRGBEntry tkColorDialog_HandleSelEntry tkColorDialog_InitValues \
7425 tkColorDialog_LeaveColorBar tkColorDialog_MoveSelector tkColorDialog_OkCmd tkColorDialog_RedrawColorBars tkColorDialog_RedrawFinalColor \
7426 tkColorDialog_ReleaseMouse tkColorDialog_ResizeColorBars tkColorDialog_RgbToX tkColorDialog_SetRGBValue tkColorDialog_StartMove \
7427 tkColorDialog_XToRgb tkConsoleAbout tkConsoleBind tkConsoleExit tkConsoleHistory \
7428 tkConsoleInit tkConsoleInsert tkConsoleInvoke tkConsoleOutput tkConsolePrompt \
7429 tkConsoleSource tkDarken tkEntryAutoScan tkEntryBackspace tkEntryButton1 \
7430 tkEntryClosestGap tkEntryGetSelection tkEntryInsert tkEntryKeySelect tkEntryMouseSelect \
7431 tkEntryNextWord tkEntryPaste tkEntryPreviousWord tkEntrySeeInsert tkEntrySetCursor \
7432 tkEntryTranspose tkEventMotifBindings tkFDGetFileTypes tkFirstMenu tkFocusGroup_BindIn \
7433 tkFocusGroup_BindOut tkFocusGroup_Create tkFocusGroup_Destroy tkFocusGroup_In tkFocusGroup_Out \
7434 tkFocusOK tkGenerateMenuSelect tkIconList tkIconList_Add tkIconList_Arrange \
7435 tkIconList_AutoScan tkIconList_Btn1 tkIconList_Config tkIconList_Create tkIconList_CtrlBtn1 \
7436 tkIconList_Curselection tkIconList_DeleteAll tkIconList_Double1 tkIconList_DrawSelection tkIconList_FocusIn \
7437 tkIconList_FocusOut tkIconList_Get tkIconList_Goto tkIconList_Index tkIconList_Invoke \
7438 tkIconList_KeyPress tkIconList_Leave1 tkIconList_LeftRight tkIconList_Motion1 tkIconList_Reset \
7439 tkIconList_ReturnKey tkIconList_See tkIconList_Select tkIconList_Selection tkIconList_ShiftBtn1 \
7440 tkIconList_UpDown tkListbox tkListboxAutoScan tkListboxBeginExtend tkListboxBeginSelect \
7441 tkListboxBeginToggle tkListboxCancel tkListboxDataExtend tkListboxExtendUpDown tkListboxKeyAccel_Goto \
7442 tkListboxKeyAccel_Key tkListboxKeyAccel_Reset tkListboxKeyAccel_Set tkListboxKeyAccel_Unset tkListboxMotion \
7443 tkListboxSelectAll tkListboxUpDown tkMbButtonUp tkMbEnter tkMbLeave \
7444 tkMbMotion tkMbPost tkMenuButtonDown tkMenuDownArrow tkMenuDup \
7445 tkMenuEscape tkMenuFind tkMenuFindName tkMenuFirstEntry tkMenuInvoke \
7446 tkMenuLeave tkMenuLeftArrow tkMenuMotion tkMenuNextEntry tkMenuNextMenu \
7447 tkMenuRightArrow tkMenuUnpost tkMenuUpArrow tkMessageBox tkMotifFDialog \
7448 tkMotifFDialog_ActivateDList tkMotifFDialog_ActivateFEnt tkMotifFDialog_ActivateFList tkMotifFDialog_ActivateSEnt tkMotifFDialog_BrowseDList \
7449 tkMotifFDialog_BrowseFList tkMotifFDialog_BuildUI tkMotifFDialog_CancelCmd tkMotifFDialog_Config tkMotifFDialog_Create \
7450 tkMotifFDialog_FileTypes tkMotifFDialog_FilterCmd tkMotifFDialog_InterpFilter tkMotifFDialog_LoadFiles tkMotifFDialog_MakeSList \
7451 tkMotifFDialog_OkCmd tkMotifFDialog_SetFilter tkMotifFDialog_SetListMode tkMotifFDialog_Update tkPostOverPoint \
7452 tkRecolorTree tkRestoreOldGrab tkSaveGrabInfo tkScaleActivate tkScaleButton2Down \
7453 tkScaleButtonDown tkScaleControlPress tkScaleDrag tkScaleEndDrag tkScaleIncrement \
7454 tkScreenChanged tkScrollButton2Down tkScrollButtonDown tkScrollButtonDrag tkScrollButtonUp \
7455 tkScrollByPages tkScrollByUnits tkScrollDrag tkScrollEndDrag tkScrollSelect \
7456 tkScrollStartDrag tkScrollTopBottom tkScrollToPos tkTabToWindow tkTearOffMenu \
7457 tkTextAutoScan tkTextButton1 tkTextClosestGap tkTextInsert tkTextKeyExtend \
7458 tkTextKeySelect tkTextNextPara tkTextNextPos tkTextNextWord tkTextPaste \
7459 tkTextPrevPara tkTextPrevPos tkTextPrevWord tkTextResetAnchor tkTextScrollPages \
7460 tkTextSelectTo tkTextSetCursor tkTextTranspose tkTextUpDownLine tkTraverseToMenu \
7461 tkTraverseWithinMenu
7463 keywords.$(file.patterns.tcl.like)=$(keywordclass.tcl)
7464 keywords2.$(file.patterns.tcl.like)=$(keywordclass.tk)
7465 keywords3.$(file.patterns.tcl.like)= $(keywordclass.TkCommands)
7466 keywords4.$(file.patterns.itcl)=$(keywordclass.itcl)
7467 keywords5.$(file.patterns.tcl.like)=expand
7469 comment.block.tcl=#~
7470 # also suported is #- for start/end of box, box.middle # can be in column 1
7471 comment.box.start.tcl=##
7472 comment.box.middle.tcl= #
7473 comment.box.end.tcl= ##
7475 # tcl styles
7476 # Other keywords (bozo test colors :-)
7479 # Braces are only matched in operator style
7480 braces.tcl.style=6
7484 ###############################################################################
7485 # From tex.properties
7486 # file    : tex.properties
7487 # version : 18 august 2003
7488 # author  : Hans Hagen / PRAGMA ADE / www.pragma-ade.com
7490 # TeX users may want to use the Latin Modern Typewriter font:
7492 #   font.monospace=font:LMTypewriter10,size:16.5
7493 #   font.errorfont=font:LMTypewriter10,size:11.5
7495 # These and more presets are done in context.properties.
7497 # TeX: patterns
7499 file.patterns.tex=*.tex;*.sty
7500 file.patterns.latex=*.tex;*.sty;*.aux;*.toc;*.idx
7501 file.patterns.context=*.tex;*.tui;*.tuo;*.sty
7503 # filter to be checked/tested:
7505 filter.tex=TeX (tex sty)|$(file.patterns.tex)|
7506 filter.latex=LaTeX (tex sty aux toc idx)|$(file.patterns.latex)|
7507 filter.context=ConTeXt (tex tui tuo sty)|$(file.patterns.context)|
7509 lexer.$(file.patterns.tex)=tex
7510 lexer.$(file.patterns.latex)=tex
7511 lexer.$(file.patterns.context)=tex
7513 *language.tex=TeX|tex||
7515 # TeX: commands (check process view)
7517 command.compile.$(file.patterns.tex)=
7518 command.build.$(file.patterns.tex)=tex $(FileNameExt)
7519 command.go.$(file.patterns.tex)=gv $(FileName).pdf
7521 command.compile.$(file.patterns.latex)=
7522 command.build.$(file.patterns.latex)=pdflatex $(FileNameExt)
7523 command.go.$(file.patterns.latex)=gv $(FileName).pdf
7525 command.compile.$(file.patterns.context)=
7526 command.build.$(file.patterns.context)=texexec --pdf $(FileNameExt)
7527 command.go.$(file.patterns.context)=gv $(FileName).pdf
7529 command.0.$(file.patterns.tex)=
7530 command.1.$(file.patterns.tex)=
7531 command.2.$(file.patterns.tex)=
7532 command.3.$(file.patterns.tex)=
7533 command.4.$(file.patterns.tex)=
7534 command.5.$(file.patterns.tex)=
7535 command.6.$(file.patterns.tex)=
7536 command.7.$(file.patterns.tex)=
7537 command.8.$(file.patterns.tex)=
7538 command.9.$(file.patterns.tex)=
7540 command.0.$(file.patterns.latex)=
7541 command.1.$(file.patterns.latex)=
7542 command.2.$(file.patterns.latex)=
7543 command.3.$(file.patterns.latex)=
7544 command.4.$(file.patterns.latex)=
7545 command.5.$(file.patterns.latex)=
7546 command.6.$(file.patterns.latex)=
7547 command.7.$(file.patterns.latex)=
7548 command.8.$(file.patterns.latex)=
7549 command.9.$(file.patterns.latex)=
7551 command.0.$(file.patterns.context)=
7552 command.1.$(file.patterns.context)=
7553 command.2.$(file.patterns.context)=
7554 command.3.$(file.patterns.context)=
7555 command.4.$(file.patterns.context)=
7556 command.5.$(file.patterns.context)=
7557 command.6.$(file.patterns.context)=
7558 command.7.$(file.patterns.context)=
7559 command.8.$(file.patterns.context)=
7560 command.9.$(file.patterns.context)=
7562 # BibTeX command
7563 command.name.2.$(file.patterns.tex)=BibTeX
7564 command.name.2.$(file.patterns.latex)=BibTeX
7565 command.name.2.$(file.patterns.context)=BibTeX
7566 command.2.$(file.patterns.tex)=bibtex $(FileName)
7567 command.2.$(file.patterns.latex)=bibtex $(FileName)
7568 command.2.$(file.patterns.context)=bibtex $(FileName)
7570 # TeX: highlighting
7574 # TeX: comments
7576 comment.block.tex=%
7577 comment.block.at.line.start.tex=1
7579 # TeX: lexer.tex.interface.default
7581 # 0 all \commands
7582 # 1 tex etex pdftex omega primitives
7583 # 2 context nl (when context.properties is loaded)
7584 # 3 context en (when context.properties is loaded)
7585 # 4 context de (when context.properties is loaded)
7586 # 5 context cz (when context.properties is loaded)
7587 # 6 context it (when context.properties is loaded)
7588 # 7 context ro (when context.properties is loaded)
7589 # 8 latex (no keywords yet; will move up)
7591 # first lines of a tex file are interpreted as follows
7593 # % interface=all|nl|en|de|cz|it|ro|latex
7595 lexer.tex.interface.default=0
7597 # TeX: lexer.tex.use.keywords
7599 # 0 don't use keyword lists
7600 # 1 use keyword lists
7602 lexer.tex.use.keywords=1
7604 # TeX: lexer.tex.comment.process
7606 # 0 don't interpret comment
7607 # 1 color comment like source code
7609 lexer.tex.comment.process=0
7611 # TeX: lexer.tex.auto.if
7613 # 0 don't handle \if<unknown>
7614 # 1 treat \if<unknown> as command
7616 lexer.tex.auto.if=1
7618 # TeX: keywords (incomplete, just for testing and as example)
7620 keywordclass.primitives.tex=\
7621     above abovedisplayshortskip abovedisplayskip \
7622     abovewithdelims accent adjdemerits advance afterassignment \
7623     aftergroup atop atopwithdelims \
7624     badness baselineskip batchmode begingroup \
7625     belowdisplayshortskip belowdisplayskip binoppenalty botmark \
7626     box boxmaxdepth brokenpenalty \
7627     catcode char chardef cleaders closein closeout clubpenalty \
7628     copy count countdef cr crcr csname \
7629     day deadcycles def defaulthyphenchar defaultskewchar \
7630     delcode delimiter delimiterfactor delimeters \
7631     delimitershortfall delimeters dimen dimendef discretionary \
7632     displayindent displaylimits displaystyle \
7633     displaywidowpenalty displaywidth divide \
7634     doublehyphendemerits dp dump \
7635     edef else emergencystretch end endcsname endgroup endinput \
7636     endlinechar eqno errhelp errmessage errorcontextlines \
7637     errorstopmode escapechar everycr everydisplay everyhbox \
7638     everyjob everymath everypar everyvbox exhyphenpenalty \
7639     expandafter  \
7640     fam fi finalhyphendemerits firstmark floatingpenalty font \
7641     fontdimen fontname futurelet \
7642     gdef global group globaldefs \
7643     halign hangafter hangindent hbadness hbox hfil horizontal \
7644     hfill horizontal hfilneg hfuzz hoffset holdinginserts hrule \
7645     hsize hskip hss horizontal ht hyphenation hyphenchar \
7646     hyphenpenalty hyphen \
7647     if ifcase ifcat ifdim ifeof iffalse ifhbox ifhmode ifinner \
7648     ifmmode ifnum ifodd iftrue ifvbox ifvmode ifvoid ifx \
7649     ignorespaces immediate indent input inputlineno input \
7650     insert insertpenalties interlinepenalty \
7651     jobname \
7652     kern \
7653     language lastbox lastkern lastpenalty lastskip lccode \
7654     leaders left lefthyphenmin leftskip leqno let limits \
7655     linepenalty line lineskip lineskiplimit long looseness \
7656     lower lowercase \
7657     mag mark mathaccent mathbin mathchar mathchardef mathchoice \
7658     mathclose mathcode mathinner mathop mathopen mathord \
7659     mathpunct mathrel mathsurround maxdeadcycles maxdepth \
7660     meaning medmuskip message mkern month moveleft moveright \
7661     mskip multiply muskip muskipdef \
7662     newlinechar noalign noboundary noexpand noindent nolimits \
7663     nonscript scriptscript nonstopmode nulldelimiterspace \
7664     nullfont number \
7665     omit openin openout or outer output outputpenalty over \
7666     overfullrule overline overwithdelims \
7667     pagedepth pagefilllstretch pagefillstretch pagefilstretch \
7668     pagegoal pageshrink pagestretch pagetotal par parfillskip \
7669     parindent parshape parskip patterns pausing penalty \
7670     postdisplaypenalty predisplaypenalty predisplaysize \
7671     pretolerance prevdepth prevgraf \
7672     radical raise read relax relpenalty right righthyphenmin \
7673     rightskip romannumeral \
7674     scriptfont scriptscriptfont scriptscriptstyle scriptspace \
7675     scriptstyle scrollmode setbox setlanguage sfcode shipout \
7676     show showbox showboxbreadth showboxdepth showlists showthe \
7677     skewchar skip skipdef spacefactor spaceskip span special \
7678     splitbotmark splitfirstmark splitmaxdepth splittopskip \
7679     string \
7680     tabskip textfont textstyle the thickmuskip thinmuskip time \
7681     toks toksdef tolerance topmark topskip tracingcommands \
7682     tracinglostchars tracingmacros tracingonline tracingoutput \
7683     tracingpages tracingparagraphs tracingrestores tracingstats \
7684     uccode uchyph underline unhbox unhcopy unkern unpenalty \
7685     unskip unvbox unvcopy uppercase \
7686     vadjust valign vbadness vbox vcenter vfil vfill vfilneg \
7687     vfuzz voffset vrule vsize vskip vsplit vss vtop \
7688     wd widowpenalty write \
7689     xdef xleaders xspaceskip \
7690     year
7692 keywordclass.primitives.etex=\
7693     beginL beginR botmarks \
7694     clubpenalties currentgrouplevel currentgrouptype \
7695     currentifbranch currentiflevel currentiftype \
7696     detokenize dimexpr displaywidowpenalties \
7697     endL endR eTeXrevision eTeXversion everyeof \
7698     firstmarks fontchardp fontcharht fontcharic fontcharwd \
7699     glueexpr glueshrink glueshrinkorder gluestretch \
7700     gluestretchorder gluetomu \
7701     ifcsname ifdefined iffontchar interactionmode \
7702     interactionmode interlinepenalties \
7703     lastlinefit lastnodetype \
7704     marks topmarks middle muexpr mutoglue \
7705     numexpr \
7706     pagediscards parshapedimen parshapeindent parshapelength \
7707     predisplaydirection \
7708     savinghyphcodes savingvdiscards scantokens showgroups \
7709     showifs showtokens splitdiscards splitfirstmarks \
7710     TeXXeTstate tracingassigns tracinggroups tracingifs \
7711     tracingnesting tracingscantokens \
7712     unexpanded unless \
7713     widowpenalties
7715 keywordclass.primitives.pdftex=\
7716     pdfadjustspacing pdfannot pdfavoidoverfull \
7717     pdfcatalog pdfcompresslevel \
7718     pdfdecimaldigits pdfdest pdfdestmargin \
7719     pdfendlink pdfendthread \
7720     pdffontattr pdffontexpand pdffontname pdffontobjnum pdffontsize \
7721     pdfhorigin \
7722     pdfimageresolution pdfincludechars pdfinfo \
7723     pdflastannot pdflastdemerits pdflastobj \
7724     pdflastvbreakpenalty pdflastxform pdflastximage \
7725     pdflastximagepages pdflastxpos pdflastypos \
7726     pdflinesnapx pdflinesnapy pdflinkmargin pdfliteral \
7727     pdfmapfile pdfmaxpenalty pdfminpenalty pdfmovechars \
7728     pdfnames \
7729     pdfobj pdfoptionpdfminorversion pdfoutline pdfoutput \
7730     pdfpageattr pdfpageheight pdfpageresources pdfpagesattr \
7731     pdfpagewidth pdfpkresolution pdfprotrudechars \
7732     pdfrefobj pdfrefxform pdfrefximage \
7733     pdfsavepos pdfsnaprefpoint pdfsnapx pdfsnapy pdfstartlink \
7734     pdfstartthread \
7735     pdftexrevision pdftexversion pdfthread pdfthreadmargin \
7736     pdfuniqueresname \
7737     pdfvorigin \
7738     pdfxform pdfximage
7740 keywordclass.primitives.omega=\
7741     odelimiter omathaccent omathchar oradical omathchardef omathcode odelcode \
7742     leftghost rightghost \
7743     charwd charht chardp charit \
7744     localleftbox localrightbox \
7745     localinterlinepenalty localbrokenpenalty \
7746     pagedir bodydir pardir textdir mathdir \
7747     boxdir nextfakemath \
7748     pagewidth pageheight pagerightoffset pagebottomoffset \
7749     nullocp nullocplist ocp externalocp ocplist pushocplist popocplist clearocplists ocptracelevel \
7750     addbeforeocplist addafterocplist removebeforeocplist removeafterocplist \
7751     OmegaVersion \
7752     InputTranslation OutputTranslation DefaultInputTranslation DefaultOutputTranslation \
7753     noInputTranslation noOutputTranslation \
7754     InputMode OutputMode DefaultInputMode DefaultOutputMode \
7755     noInputMode noOutputMode noDefaultInputMode noDefaultOutputMode
7757 # only the macros that make sense:
7759 keywordclass.macros.plain.partial=\
7760     TeX \
7761     bgroup egroup endgraf space empty null \
7762     newcount newdimen newskip newmuskip newbox newtoks newhelp newread newwrite newfam newlanguage newinsert newif \
7763     maxdimen magstephalf magstep \
7764     frenchspacing nonfrenchspacing normalbaselines obeylines obeyspaces raggedright ttraggedright \
7765     thinspace negthinspace enspace enskip quad qquad \
7766     smallskip medskip bigskip removelastskip topglue vglue hglue \
7767     break nobreak allowbreak filbreak goodbreak smallbreak medbreak bigbreak \
7768     line leftline rightline centerline rlap llap underbar strutbox strut \
7769     cases matrix pmatrix bordermatrix eqalign displaylines eqalignno leqalignno \
7770     pageno folio tracingall showhyphens fmtname fmtversion \
7771     hphantom vphantom phantom smash
7773 keywordclass.macros.eplain.partial=\
7774     eTeX \
7775     newmarks grouptype interactionmode nodetype iftype \
7776     tracingall loggingall tracingnone
7778 # for fun
7780 keywordclass.primitives.pdftex.experimental=
7782 keywordclass.primitives.all=\
7783     $(keywordclass.primitives.tex) \
7784     $(keywordclass.primitives.etex) \
7785     $(keywordclass.primitives.pdftex) \
7786     $(keywordclass.primitives.pdftex.experimental) \
7787     $(keywordclass.primitives.omega)
7789 # hooks for context
7791 keywordclass.macros.context.undocumented.en=
7792 keywordclass.macros.context.undocumented.nl=
7793 keywordclass.macros.context.undocumented.de=
7794 keywordclass.macros.context.undocumented.cz=
7795 keywordclass.macros.context.undocumented.it=
7796 keywordclass.macros.context.undocumented.ro=
7798 keywordclass.macros.context.extras=
7800 keywordclass.macros.context.nl=
7801 keywordclass.macros.context.en=
7802 keywordclass.macros.context.de=
7803 keywordclass.macros.context.cz=
7804 keywordclass.macros.context.it=
7805 keywordclass.macros.context.ro=
7807 import cont-en-scite
7808 import cont-nl-scite
7809 import cont-de-scite
7810 import cont-cz-scite
7811 import cont-it-scite
7812 import cont-ro-scite
7814 import cont-xx-scite
7816 # hooks for latex (file should define keywordclass.macros.latex.all)
7818 keywordclass.macros.latex.all=
7820 import latex-scite
7822 # collections
7824 keywordclass.tex.all=\
7825     $(keywordclass.primitives.tex) \
7826     $(keywordclass.macros.plain.partial)
7828 keywordclass.etex.all=\
7829     $(keywordclass.primitives.tex) \
7830     $(keywordclass.primitives.etex) \
7831     $(keywordclass.macros.plain.partial) \
7832     $(keywordclass.macros.eplain.partial)
7834 keywordclass.latex.all=\
7835     $(keywordclass.primitives.tex) \
7836     $(keywordclass.primitives.etex) \
7837     $(keywordclass.macros.latex.all)
7839 keywordclass.pdflatex.all=\
7840     $(keywordclass.primitives.tex) \
7841     $(keywordclass.primitives.etex) \
7842     $(keywordclass.primitives.pdftex) \
7843     $(keywordclass.macros.latex.all)
7845 # we can't use $(keywordclass.primitives.all) here due to some kind of
7846 # limitation in nesting
7848 keywordclass.context.base=\
7849     $(keywordclass.primitives.tex) \
7850     $(keywordclass.primitives.etex) \
7851     $(keywordclass.primitives.pdftex) \
7852     $(keywordclass.primitives.pdftex.experimental) \
7853     $(keywordclass.primitives.omega) \
7854     $(keywordclass.macros.plain.partial) \
7855     $(keywordclass.macros.eplain.partial)
7857 keywordclass.context.all=\
7858     $(keywordclass.context.base) \
7859     $(keywordclass.macros.context.en) \
7860     $(keywordclass.macros.context.extras) \
7861     $(keywordclass.macros.context.undocumented.en)
7863 keywordclass.context.all.nl=\
7864     $(keywordclass.context.base) \
7865     $(keywordclass.macros.context.nl) \
7866     $(keywordclass.macros.context.extras) \
7867     $(keywordclass.macros.context.undocumented.nl)
7869 keywordclass.context.all.en=\
7870     $(keywordclass.context.base) \
7871     $(keywordclass.macros.context.en) \
7872     $(keywordclass.macros.context.extras) \
7873     $(keywordclass.macros.context.undocumented.en)
7875 keywordclass.context.all.de=\
7876     $(keywordclass.context.base) \
7877     $(keywordclass.macros.context.de) \
7878     $(keywordclass.macros.context.extras) \
7879     $(keywordclass.macros.context.undocumented.de)
7881 keywordclass.context.all.cz=\
7882     $(keywordclass.context.base) \
7883     $(keywordclass.macros.context.cz) \
7884     $(keywordclass.macros.context.extras) \
7885     $(keywordclass.macros.context.undocumented.cz)
7887 keywordclass.context.all.it=\
7888     $(keywordclass.context.base) \
7889     $(keywordclass.macros.context.it) \
7890     $(keywordclass.macros.context.extras) \
7891     $(keywordclass.macros.context.undocumented.it)
7893 keywordclass.context.all.ro=\
7894     $(keywordclass.context.base) \
7895     $(keywordclass.macros.context.ro) \
7896     $(keywordclass.macros.context.extras) \
7897     $(keywordclass.macros.context.undocumented.ro)
7899 # hm
7901 keywords.$(file.patterns.tex)=$(keywordclass.tex.all)
7902 keywords.$(file.patterns.latex)=$(keywordclass.latex.all)
7903 keywords.$(file.patterns.context)=$(keywordclass.context.all)
7905 # keywords1 is not used since scintilla takes it from 'keywords'
7907 keywords.$(file.patterns.context)=$(keywordclass.context.base)
7909 keywords2.$(file.patterns.context)=$(keywordclass.context.all.nl)
7910 keywords3.$(file.patterns.context)=$(keywordclass.context.all.en)
7911 keywords4.$(file.patterns.context)=$(keywordclass.context.all.de)
7912 keywords5.$(file.patterns.context)=$(keywordclass.context.all.cz)
7913 keywords6.$(file.patterns.context)=$(keywordclass.context.all.it)
7914 keywords7.$(file.patterns.context)=$(keywordclass.context.all.ro)
7916 # keywords71.$(file.patterns.context)=$(keywordclass.tex.all)
7917 # keywords72.$(file.patterns.context)=$(keywordclass.etex.all)
7918 # keywords73.$(file.patterns.context)=$(keywordclass.pdftex.all)
7919 # keywords74.$(file.patterns.context)=$(keywordclass.pdfetex.all)
7921 # keywords91.$(file.patterns.context)=$(keywordclass.latex.all)
7923 # for the moment LaTeX gets slot 8, but we will move it up as soon as
7924 # more keyword lists can be defined
7926 keywords8.$(file.patterns.context)=$(keywordclass.pdflatex.all)
7928 # TeX: words
7930 word.characters.$(file.patterns.tex)=$(chars.alpha)$(chars.numeric)$(chars.accented)\@
7931 word.characters.$(file.patterns.latex)=$(chars.alpha)$(chars.numeric)$(chars.accented)\@
7932 word.characters.$(file.patterns.context)=$(chars.alpha)$(chars.numeric)$(chars.accented)\@!?
7934 # TeX: end of file
7938 ###############################################################################
7939 # From txt2tags.properties
7940 # Define SciTE settings for txt2tags.
7942 file.patterns.txt2tags=*.t2t
7944 shbang.txt2tags=txt2tags
7946 filter.txt2tags=Txt2tags (t2t)|$(file.patterns.txt2tags)|
7948 *filter.txt2tags=$(filter.txt2tags)
7950 lexer.$(file.patterns.txt2tags)=txt2tags
7952 *language.txt2tags=&txt2tags|t2t||
7985 ###############################################################################
7986 # From vb.properties
7987 # Define SciTE settings for VB files.
7989 # BAS: Module, FRM: Form, CLS: Class Module, CTL: User Control
7990 # PAG: Property Page, DSR: Data Report, DOB: User Document
7991 file.patterns.vb=*.vb;*.bas;*.frm;*.cls;*.ctl;*.pag;*.dsr;*.dob
7992 # VBS: VBScript, DSM: Visual[ex. Dev] Studio macro
7993 file.patterns.wscript=*.vbs;*.dsm
7995 *source.patterns.vb=$(file.patterns.vb);$(file.patterns.wscript);
7997 # VBP: VB Project, VBG: VB Project Group (ActiveX), MAK: old (VB3) project file, VBW: VB Workspace
7998 filter.vb=VB (vb vbp vbs bas frm cls ctl pag dsr dob)|$(file.patterns.vb);$(file.patterns.wscript);*.vbp;*.vbg;*.mak;*.vbw|
8000 *filter.vb=$(filter.vb)
8002 lexer.$(file.patterns.vb)=vb
8003 lexer.$(file.patterns.wscript)=vbscript
8005 *language.vb=&VB|vb||
8006 #*language.vbscript=VBScr&ipt|vbs||
8008 # Keywords, operators, statements, data types and some words in .frm files
8009 keywordclass.vb6=\
8010 addressof alias and as attribute base begin binary boolean byref byte byval call case cdbl \
8011 cint clng compare const csng cstr currency date decimal declare defbool defbyte defcur \
8012 defdate defdbl defdec defint deflng defobj defsng defstr defvar dim do double each else \
8013 elseif empty end enum eqv erase error event exit explicit false for friend function get \
8014 global gosub goto if imp implements in input integer is len let lib like load lock long \
8015 loop lset me mid midb mod new next not nothing null object on option optional or paramarray \
8016 preserve print private property public raiseevent randomize redim rem resume return rset \
8017 seek select set single static step stop string sub text then time to true type typeof \
8018 unload until variant wend while with withevents xor
8020 # html.properties picks up VB keywords from keywordclass.vb
8021 keywordclass.vb=$(keywordclass.vb6)
8023 # Mostly system statements (files, registry, I/O...) that
8024 # I am not sure to include with the regular statements.
8025 keywordclass.vbotherstatements=\
8026 appactivate beep chdir chdrive close filecopy get input kill line unlock mkdir name \
8027 open print put reset rmdir savepicture savesetting seek sendkeys setattr width write
8029 # VBNet specific keywords
8030 keywordclass.vbnet=\
8031 addhandler andalso ansi assembly auto catch cbool cbyte cchar cdate cdec char class \
8032 cobj continue csbyte cshort ctype cuint culng cushort custom default delegate directcast \
8033 endif externalsource finally gettype handles imports inherits interface isfalse isnot \
8034 istrue module mustinherit mustoverride my mybase myclass namespace narrowing notinheritable \
8035 notoverridable of off operator orelse overloads overridable overrides partial protected \
8036 readonly region removehandler sbyte shadows shared short strict structure synclock \
8037 throw try trycast uinteger ulong unicode ushort using when widening writeonly
8039 keywords.$(file.patterns.vb)=$(keywordclass.vb6) $(keywordclass.vbnet)
8040 keywords.$(file.patterns.wscript)=$(keywordclass.vb6)
8042 keywords2.$(file.patterns.vb)=$(keywordclass.vbotherstatements)
8044 comment.block.vb='~
8045 comment.block.vbscript='~
8046 # VB styles
8050 # wscript
8051 # normal execute
8052 command.go.$(file.patterns.wscript)="$(FilePath)"
8053 command.go.subsystem.$(file.patterns.wscript)=2
8055 # note we have no real "build"; rather "execute and capture
8056 # compiletime and runtime errors"
8057 command.build.$(file.patterns.wscript)=cscript "$(FilePath)"
8058 command.build.subsystem.$(file.patterns.wscript)=1
8060 command.help.$(file.patterns.wscript)=$(CurrentWord)!C:\Program Files\Microsoft Visual Studio\MSDN\2001OCT\1033\MSDN130.COL
8061 command.help.subsystem.$(file.patterns.wscript)=4
8062 command.help.$(file.patterns.vb)=$(CurrentWord)!C:\Program Files\Microsoft Visual Studio\MSDN\2001OCT\1033\MSDN130.COL
8063 command.help.subsystem.$(file.patterns.vb)=4
8067 ###############################################################################
8068 # From verilog.properties
8069 # Define SciTE settings for Verilog files.
8071 # Verilog files
8072 file.patterns.verilog=*.v;*.vh
8073 filter.verilog=Verilog (verilog)|$(file.patterns.verilog)|
8075 *filter.verilog=$(filter.verilog)
8077 lexer.$(file.patterns.verilog)=verilog
8079 *language.verilog=Verilog|v||
8081 word.chars.verilog=$(chars.alpha)$(chars.numeric)_`$#
8082 word.characters.$(file.patterns.verilog)=$(word.chars.verilog)
8084 calltip.verilog.word.characters=$(chars.alpha)$(chars.numeric)_$
8086 comment.block.verilog=//~
8087 #comment.block.at.line.start.verilog=1
8088 comment.stream.start.verilog=/*
8089 comment.stream.end.verilog=*/
8090 comment.box.start.verilog=/*
8091 comment.box.middle.verilog= *
8092 comment.box.end.verilog= */
8094 fold.verilog.flags=0
8096 statement.lookback.$(file.patterns.verilog)=20
8097 statement.end.$(file.patterns.verilog)=10 ;
8098 block.start.$(file.patterns.verilog)=5 begin case casex casez
8099 block.end.$(file.patterns.verilog)=5 begin end endcase
8100 statement.indent.$(file.patterns.verilog)=5 always else for if while
8102 indent.maintain.$(file.patterns.verilog)=0
8104 preprocessor.symbol.$(file.patterns.verilog)=`
8105 preprocessor.start.$(file.patterns.verilog)=ifdef ifndef
8106 preprocessor.middle.$(file.patterns.verilog)=else
8107 preprocessor.end.$(file.patterns.verilog)=endif
8109 keywordclass.verilog= \
8110 always and assign automatic \
8111 begin buf bufif0 bufif1 \
8112 case casex casez cell cmos config \
8113 deassign default defparam design disable \
8114 edge else end endcase endconfig endfunction endgenerate endmodule endprimitive endspecify endtable endtask event \
8115 for force forever fork function \
8116 generate genvar \
8117 highz0 highz1 \
8118 if ifnone incdir include initial inout input instance integer \
8119 join \
8120 large liblist library localparam \
8121 macromodule medium module \
8122 nand negedge nmos nor noshowcancelled not notif0 notif1 \
8123 or output \
8124 parameter pmos posedge primitive pull0 pull1 pulldown pullup pulsestyle_ondetect pulsestyle_onevent \
8125 rcmos real realtime reg release repeat rnmos rpmos rtran rtranif0 rtranif1 \
8126 scalared showcancelled signed small specify specparam strong0 strong1 supply0 supply1 \
8127 table task time tran tranif0 tranif1 tri tri0 tri1 triand trior trireg \
8128 unsigned use uwire \
8129 vectored \
8130 wait wand weak0 weak1 while wire wor \
8131 xnor xor
8133 keywords.$(file.patterns.verilog)=$(keywordclass.verilog)
8135 # Secondary keywords and identifiers
8136 keywords2.$(file.patterns.verilog)=
8137 keywords3.$(file.patterns.verilog)= \
8138 $async$and$array $async$and$plane $async$nand$array $async$nand$plane $async$nor$array $async$nor$plane $async$or$array $async$or$plane \
8139 $bitstoreal \
8140 $countdrivers \
8141 $display $displayb $displayh $displayo \
8142 $dist_chi_square $dist_erlang $dist_exponential $dist_normal $dist_poisson $dist_t $dist_uniform \
8143 $dumpall $dumpfile $dumpflush $dumplimit $dumpoff $dumpon $dumpportsall $dumpportsflush $dumpportslimit $dumpportsoff $dumpportson $dumpvars \
8144 $fclose $fdisplayh $fdisplay $fdisplayf $fdisplayb $feof $ferror $fflush $fgetc $fgets $finish $fmonitorb $fmonitor $fmonitorf $fmonitorh $fopen $fread $fscanf $fseek $fsscanf $fstrobe $fstrobebb $fstrobef $fstrobeh $ftel $fullskew $fwriteb $fwritef $fwriteh $fwrite \
8145 $getpattern \
8146 $history $hold \
8147 $incsave $input $itor \
8148 $key \
8149 $list $log \
8150 $monitorb $monitorh $monitoroff $monitoron $monitor $monitoro \
8151 $nochange $nokey $nolog \
8152 $period $printtimescale \
8153 $q_add $q_exam $q_full $q_initialize $q_remove \
8154 $random $readmemb $readmemh $readmemh $realtime $realtobits $recovery $recrem $removal $reset_count $reset $reset_value $restart $rewind $rtoi \
8155 $save $scale $scope $sdf_annotate $setup $setuphold $sformat $showscopes $showvariables $showvars $signed $skew $sreadmemb $sreadmemh $stime $stop $strobeb $strobe $strobeh $strobeo $swriteb $swriteh $swriteo $swrite $sync$and$array $sync$and$plane $sync$nand$array $sync$nand$plane $sync$nor$array $sync$nor$plane $sync$or$array $sync$or$plane \
8156 $test$plusargs $time $timeformat $timeskew \
8157 $ungetc $unsigned \
8158 $value$plusargs \
8159 $width $writeb $writeh $write $writeo
8160 # User defined tasks and identifiers
8161 keywords4.$(file.patterns.verilog)=
8162 # comment keyword
8163 keywords5.$(file.patterns.verilog)= synopsys parallel_case infer_mux TODO
8166 # Define SciTE settings for SystemVerilog files.
8168 # systemverilog files
8169 file.patterns.systemverilog=*.sv;*.svh
8170 filter.systemverilog=systemverilog (systemverilog)|$(file.patterns.systemverilog)|
8171 lexer.$(file.patterns.systemverilog)=verilog
8173 word.chars.systemverilog=$(chars.alpha)$(chars.numeric)_`$#
8174 word.characters.$(file.patterns.systemverilog)=$(word.chars.systemverilog)
8176 statement.lookback.$(file.patterns.systemverilog)=20
8177 statement.end.$(file.patterns.systemverilog)=10 ;
8178 block.start.$(file.patterns.systemverilog)=5 begin case casex casez
8179 block.end.$(file.patterns.systemverilog)=5 begin end endcase
8180 statement.indent.$(file.patterns.systemverilog)=5 always else for if while
8182 indent.maintain.$(file.patterns.systemverilog)= 0
8184 preprocessor.symbol.$(file.patterns.systemverilog)=`
8185 preprocessor.start.$(file.patterns.systemverilog)=ifdef ifndef
8186 preprocessor.middle.$(file.patterns.systemverilog)=else
8187 preprocessor.end.$(file.patterns.systemverilog)=endif
8189 # Taken from the SystemVerilog IEEE Std 1800-2005 Annex B
8190 keywords.$(file.patterns.systemverilog)=\
8191 alias always always_comb always_ff always_latch and assert assign assume \
8192 automatic before begin bind bins binsof bit break buf bufif0 bufif1 byte case \
8193 casex casez cell chandle class clocking cmos config const constraint context \
8194 continue cover covergroup coverpoint cross deassign default defparam design \
8195 disable dist do edge else end endcase endclass endclocking endconfig \
8196 endfunction endgenerate endgroup endinterface endmodule endpackage \
8197 endprimitive endprogram endproperty endspecify endsequence endtable endtask \
8198 enum event expect export extends extern final first_match for force foreach \
8199 forever fork forkjoin function generate genvar highz0 highz1 if iff ifnone \
8200 ignore_bins illegal_bins import incdir include initial inout input inside \
8201 instance int integer interface intersect join join_any join_none large liblist \
8202 library local localparam logic longint macromodule matches medium modport \
8203 module nand negedge new nmos nor noshowcancelled not notif0 notif1 null or \
8204 output package packed parameter pmos posedge primitive priority program \
8205 property protected pull0 pull1 pulldown pullup pulsestyle_onevent \
8206 pulsestyle_ondetect pure rand randc randcase randsequence rcmos real realtime \
8207 ref reg release repeat return rnmos rpmos rtran rtranif0 rtranif1 scalared \
8208 sequence shortint shortreal showcancelled signed small solve specify specparam \
8209 static string strong0 strong1 struct super supply0 supply1 table tagged task \
8210 this throughout time timeprecision timeunit tran tranif0 tranif1 tri tri0 tri1 \
8211 triand trior trireg type typedef union unique unsigned use uwire var vectored \
8212 virtual void wait wait_order wand weak0 weak1 while wildcard wire with within \
8213 wor xnor xor
8215 # Secondary keywords and identifiers
8216 keywords2.$(file.patterns.systemverilog)=
8218 # System Tasks
8219 keywords3.$(file.patterns.systemverilog)=\
8220 $acos $acosh $asin $asinh $assertfailoff $assertfailon $assertkill \
8221 $assertnonvacuouson $assertoff $asserton $assertpassoff $assertpasson \
8222 $assertvacuousoff $async$and$array $async$and$plane $async$nand$array \
8223 $async$nand$plane $async$nor$array $async$nor$plane $async$or$array \
8224 $async$or$plane $atan $atan2 $atanh $bits $bitstoreal $bitstoshortreal $cast \
8225 $ceil $changed $changed_gclk $changing_gclk $clog2 $cos $cosh $countdrivers \
8226 $countones $coverage_control $coverage_get $coverage_get_max $coverage_merge \
8227 $coverage_save $dimensions $display $displayb $displayh $displayo \
8228 $dist_chi_square $dist_erlang $dist_exponential $dist_normal $dist_poisson \
8229 $dist_t $dist_uniform $dumpall $dumpfile $dumpflush $dumplimit $dumpoff \
8230 $dumpon $dumpports $dumpportsall $dumpportsflush $dumpportslimit $dumpportsoff \
8231 $dumpportson $dumpvars $error $exit $exp $falling_gclk $fatal $fclose \
8232 $fdisplay $fdisplayb $fdisplayf $fdisplayh $fdisplayo $fell $fell_gclk $feof \
8233 $ferror $fflush $fgetc $fgets $finish $floor $fmonitor $fmonitorb $fmonitorf \
8234 $fmonitorh $fmonitoro $fopen $fread $fscanf $fseek $fsscanf $fstrobe $fstrobeb \
8235 $fstrobebb $fstrobef $fstrobeh $fstrobeo $ftel $ftell $fullskew $future_gclk \
8236 $fwrite $fwriteb $fwritef $fwriteh $fwriteo $get_coverage $getpattern $high \
8237 $history $hold $hypot $increment $incsave $info $input $isunbounded $isunknown \
8238 $itor $key $left $list $ln $load_coverage_db $log $log10 $low $monitor \
8239 $monitorb $monitorh $monitoro $monitoroff $monitoron $nochange $nokey $nolog \
8240 $onehot $onehot0 $past $past_gclk $period $pow $printtimescale $q_add $q_exam \
8241 $q_full $q_initialize $q_remove $random $readmemb $readmemh $realtime \
8242 $realtobits $recovery $recrem $removal $reset $reset_count $reset_value \
8243 $restart $rewind $right $rising_gclk $root $rose $rose_gclk $rtoi $sampled \
8244 $save $scale $scope $sdf_annotate $set_coverage_db_name $setup $setuphold \
8245 $sformat $sformatf $shortrealtobits $showscopes $showvariables $showvars \
8246 $signed $sin $sinh $size $skew $sqrt $sreadmemb $sreadmemh $sscanf $stable \
8247 $stable_gclk $steady_gclk $stime $stop $strobe $strobeb $strobeh $strobeo \
8248 $swrite $swriteb $swriteh $swriteo $sync$and$array $sync$and$plane \
8249 $sync$nand$array $sync$nand$plane $sync$nor$array $sync$nor$plane \
8250 $sync$or$array $sync$or$plane $system $tan $tanh $test$plusargs $time \
8251 $timeformat $timeskew $typename $ungetc $unit $unpacked_dimensions $unsigned \
8252 $urandom $urandom_range $value$plusargs $warning $width $write $writeb $writeh \
8253 $writememb $writememh $writeo
8255 # User defined tasks and identifiers
8256 keywords4.$(file.patterns.systemverilog)=
8257 # comment keyword
8258 keywords5.$(file.patterns.systemverilog)= synopsys parallel_case infer_mux TODO
8261 # Verilog styles
8264 # Turn on port styling features
8265 lexer.verilog.portstyling=1
8266 # Turn on treatment of all uppercase identifiers as user-defined keywords
8267 lexer.verilog.allupperkeywords=1
8269 # Support for colorizing inactive code due to preprocessor directives
8270 lexer.verilog.track.preprocessor=1
8271 lexer.verilog.update.preprocessor=1
8273 # Inactive states are 64 greater than their active counterparts
8276 # Braces are only matched in operator style
8277 braces.verilog.style=10
8282 ###############################################################################
8283 # From vhdl.properties
8284 # Define SciTE settings for vhdl files.
8286 # VHDL files
8287 file.patterns.vhdl=*.vhd;*.vhdl
8288 filter.vhdl=VHDL (vhd vhdl)|$(file.patterns.vhdl)|
8290 *filter.vhdl=$(filter.vhdl)
8292 lexer.$(file.patterns.vhdl)=vhdl
8294 *language.vhdl=VHDL|vhd||
8296 word.chars.vhdl=$(chars.alpha)$(chars.numeric)_
8297 word.characters.$(file.patterns.vhdl)=$(word.chars.vhdl)
8299 #calltip.vhdl.word.characters=$(chars.alpha)$(chars.numeric)_
8301 comment.block.vhdl=--
8302 #comment.block.at.line.start.vhdl=1
8303 #comment.stream.start.vhdl=/*
8304 #comment.stream.end.vhdl=*/
8305 #comment.box.start.vhdl=/*
8306 #comment.box.middle.vhdl= *
8307 #comment.box.end.vhdl= */
8309 #~ fold.at.Begin=1
8310 #~ fold.at.Parenthese=1
8312 #statement.lookback.$(file.patterns.vhdl)=20
8313 #block.start.$(file.patterns.vhdl)=5 begin
8314 #block.end.$(file.patterns.vhdl)=5 end
8315 #statement.indent.$(file.patterns.vhdl)=5 always case casex casez else for if while \
8316 #module function task
8318 indent.maintain.$(file.patterns.vhdl)=1;
8321 keywords.$(file.patterns.vhdl)=access after alias all architecture array assert attribute begin block \
8322 body buffer bus case component configuration constant disconnect downto else elsif end entity exit file \
8323 for function generate generic group guarded if impure in inertial inout is label library linkage literal \
8324 loop map new next null of on open others out package port postponed procedure process pure range record \
8325 register reject report return select severity shared signal subtype then to transport type unaffected \
8326 units until use variable wait when while with
8328 keywords2.$(file.patterns.vhdl)=                                                                            \
8329  abs and mod nand nor not or rem rol ror sla sll sra srl xnor xor
8331 keywords3.$(file.patterns.vhdl)=                                                                            \
8332  left right low high ascending image value pos val succ pred leftof rightof base range reverse_range        \
8333  length delayed stable quiet transaction event active last_event last_active last_value driving             \
8334  driving_value simple_name path_name instance_name
8336 keywords4.$(file.patterns.vhdl)=                                                                            \
8337  now readline read writeline write endfile resolved to_bit to_bitvector to_stdulogic to_stdlogicvector      \
8338  to_stdulogicvector to_x01 to_x01z to_UX01 rising_edge falling_edge is_x shift_left shift_right rotate_left \
8339  rotate_right resize to_integer to_unsigned to_signed std_match to_01
8341 keywords5.$(file.patterns.vhdl)=                                                                            \
8342  std ieee work standard textio std_logic_1164 std_logic_arith std_logic_misc std_logic_signed               \
8343  std_logic_textio std_logic_unsigned numeric_bit numeric_std math_complex math_real vital_primitives        \
8344  vital_timing
8346 keywords6.$(file.patterns.vhdl)=                                                                            \
8347  boolean bit character severity_level integer real time delay_length natural positive string bit_vector     \
8348  file_open_kind file_open_status line text side width std_ulogic std_ulogic_vector std_logic                \
8349  std_logic_vector X01 X01Z UX01 UX01Z unsigned signed
8351 # vhdl styles
8353 # Braces are only matched in operator style
8354 braces.vhdl.style=5
8358 ###############################################################################
8359 # From yaml.properties
8360 # Define SciTE settings for YAML files.
8362 # associate YAML file patter with the YAML lexer
8363 file.patterns.yaml=*.yaml;*.yml
8364 filter.yaml=YAML (yaml)|$(file.patterns.yaml)|
8365 *filter.yaml=$(filter.yaml)
8366 lexer.$(file.patterns.yaml)=yaml
8367 *language.yaml=YAML|yaml||
8369 # YAML requires spaces for tabs
8370 tabsize.$(file.patterns.yaml)=2
8371 indent.size.$(file.patterns.yaml)=2
8372 use.tabs.$(file.patterns.yaml)=0
8374 # YAML comment character
8375 comment.block.yaml=#~
8377 # YAML convertible values
8378 keywords.$(file.patterns.yaml)=true false yes no
8380 # YAML font styles
8386 ###############################################################################
8387 # Style for COBOL from file cobol.properties
8389 # Note: all non-comment fonts are forced to monospace
8390         style.COBOL.0=$(style.anjuta.normal)
8391 # Line comment
8392         style.COBOL.2=$(style.anjuta.comment)
8393 # Doc comment
8394         style.COBOL.3=$(style.anjuta.comment)
8395 # Number
8396         style.COBOL.4=$(style.anjuta.number)
8397 # Keyword (A)
8398         style.COBOL.5=$(style.anjuta.keyword)
8399 # String
8400         style.COBOL.6=$(style.anjuta.string)
8401 # Character
8402         style.COBOL.7=$(style.anjuta.char)
8403 # Extended keyword
8404         style.COBOL.8=$(style.anjuta.localkeyword)
8405 # Preprocessor
8406         style.COBOL.9=$(style.anjuta.preprocessor)
8407 # Operators
8408         style.COBOL.10=$(style.anjuta.operator)
8409 # Identifier
8410         style.COBOL.11=$(style.anjuta.identifier)
8411 # Keyword (B)
8412         style.COBOL.16=$(style.anjuta.function)
8416 ###############################################################################
8417 # Style for TACL from file tacl.properties
8419 # 11,Identifier|16,Label|
8420         style.TACL.0=$(style.anjuta.normal)
8421 # Comment
8422         style.TACL.1=$(style.anjuta.comment)
8423 # Line comment
8424         style.TACL.2=$(style.anjuta.comment)
8425 # Doc comment
8426         style.TACL.3=$(style.anjuta.comment)
8427 # Number
8428         style.TACL.4=$(style.anjuta.number)
8429 # Builtin
8430         style.TACL.5=$(style.anjuta.keyword)
8431 # String
8432         style.TACL.6=$(style.anjuta.string)
8433 # Character
8434         style.TACL.7=$(style.anjuta.char)
8435 # Command
8436         style.TACL.8=$(style.anjuta.localkeyword)
8437 # Preprocessor
8438         style.TACL.9=$(style.anjuta.preprocessor)
8439 # Operators
8440         style.TACL.10=$(style.anjuta.operator)
8441 # Identifier
8442         style.TACL.11=$(style.anjuta.identifier)
8443 # Label
8444         style.TACL.16=$(style.anjuta.function)
8448 ###############################################################################
8449 # Style for TAL from file tal.properties
8451 # 11,Identifier
8452         style.TAL.0=$(style.anjuta.normal)
8453 # Comment
8454         style.TAL.1=$(style.anjuta.comment)
8455 # Line comment
8456         style.TAL.2=$(style.anjuta.comment)
8457 # Doc comment
8458         style.TAL.3=$(style.anjuta.comment)
8459 # Number
8460         style.TAL.4=$(style.anjuta.number)
8461 # Keyword
8462         style.TAL.5=$(style.anjuta.keyword)
8463 # String
8464         style.TAL.6=$(style.anjuta.string)
8465 # Character
8466         style.TAL.7=$(style.anjuta.char)
8467 # Unreserved keyword
8468         style.TAL.8=$(style.anjuta.localkeyword)
8469 # Preprocessor
8470         style.TAL.9=$(style.anjuta.preprocessor)
8471 # Operators
8472         style.TAL.10=$(style.anjuta.operator)
8473 # Identifier
8474         style.TAL.11=$(style.anjuta.identifier)
8478 ###############################################################################
8479 # Style for abaqus from file abaqus.properties
8481 # Default
8482         style.abaqus.0=$(style.anjuta.normal)
8483 # Comment
8484         style.abaqus.1=$(style.anjuta.comment)
8485 # Comment-blocks
8486         style.abaqus.2=$(style.anjuta.comment)
8487 # Number
8488         style.abaqus.3=$(style.anjuta.number)
8489 # Quoted string
8490         style.abaqus.4=$(style.anjuta.char)
8491 # Ansys operator
8492         style.abaqus.5=$(style.anjuta.operator)
8493 # Ansys word
8494         style.abaqus.6=$(style.anjuta.keyword)
8495 # Ansys processor
8496         style.abaqus.7=$(style.anjuta.preprocessor)
8497 # Ansys command
8498         style.abaqus.8=$(style.anjuta.localkeyword)
8499 # Ansys slashcommand
8500         style.abaqus.9=$(style.anjuta.syskeyword)
8501 # Ansys starcommand
8502         style.abaqus.10=$(style.anjuta.syskeyword)
8503 # Ansys argument
8504         style.abaqus.11=$(style.anjuta.identifier)
8505 # Ansys function
8506         style.abaqus.12=$(style.anjuta.function)
8510 ###############################################################################
8511 # Style for ada from file ada.properties
8513 # Default
8514         style.ada.0=$(style.anjuta.whitespace)
8515 # Keyword
8516         style.ada.1=$(style.anjuta.keyword)
8517 # Number
8518         style.ada.3=$(style.anjuta.number)
8519 # Operators (delimiters)
8520         style.ada.4=$(style.anjuta.operator)
8521 # Character
8522         style.ada.5=$(style.anjuta.char)
8523 # End of line where character is not closed
8524         style.ada.6=$(style.anjuta.unclosed)
8525 # String
8526         style.ada.7=$(style.anjuta.string)
8527 # End of line where string is not closed
8528         style.ada.8=$(style.anjuta.unclosed)
8529 # Label
8530         style.ada.9=$(style.anjuta.function)
8531 # Comment
8532         style.ada.10=$(style.anjuta.comment)
8533 # Illegal token
8534         style.ada.11=$(style.anjuta.error)
8538 ###############################################################################
8539 # Style for as from file asm.properties
8542         style.as.1=$(style.anjuta.comment)
8544         style.as.2=$(style.anjuta.number)
8546         style.as.3=$(style.anjuta.string)
8548         style.as.4=$(style.anjuta.operator)
8550         style.as.5=$(style.anjuta.identifier)
8552         style.as.6=$(style.anjuta.keyword)
8554         style.as.7=$(style.anjuta.localkeyword)
8556         style.as.8=$(style.anjuta.identifier)
8558         style.as.9=$(style.anjuta.preprocessor)
8560         style.as.10=$(style.anjuta.preprocessor)
8562         style.as.11=$(style.anjuta.comment)
8564         style.as.12=$(style.anjuta.char)
8566         style.as.13=$(style.anjuta.unclosed)
8568         style.as.14=$(style.anjuta.syskeyword)
8570         style.as.15=$(style.anjuta.preprocessor)
8574 ###############################################################################
8575 # Style for asm from file asm.properties
8578         style.asm.0=$(style.anjuta.normal)
8579 # Comment
8580         style.asm.1=$(style.anjuta.comment)
8581 # Number
8582         style.asm.2=$(style.anjuta.number)
8583 # String
8584         style.asm.3=$(style.anjuta.string)
8585 # Operator
8586         style.asm.4=$(style.anjuta.operator)
8587 # CPU instruction
8588         style.asm.6=$(style.anjuta.keyword)
8589 # FPU instruction
8590         style.asm.7=$(style.anjuta.localkeyword)
8591 # Register
8592         style.asm.8=$(style.anjuta.identifier)
8593 # assembler Directive
8594         style.asm.9=$(style.anjuta.preprocessor)
8595 # assembler Directive Operand
8596         style.asm.10=$(style.anjuta.preprocessor)
8597 # Comment block (GNU as /*...*/ syntax, unimplemented)
8598         style.asm.11=$(style.anjuta.comment)
8599 # Character/String (single quote) (also character prefix in GNU as)
8600         style.asm.12=$(style.anjuta.char)
8601 # End of line where string is not closed
8602         style.asm.13=$(style.anjuta.unclosed)
8603 # Extended instructions
8604         style.asm.14=$(style.anjuta.syskeyword)
8605 # Comment directive
8606         style.asm.15=$(style.anjuta.preprocessor)
8610 ###############################################################################
8611 # Style for asn1 from file asn1.properties
8613 # Default
8614         style.asn1.0=$(style.anjuta.normal)
8615 # Comment
8616         style.asn1.1=$(style.anjuta.comment)
8617 # Identifiers
8618         style.asn1.2=$(style.anjuta.identifier)
8619 # Double quoted string
8620         style.asn1.3=$(style.anjuta.string)
8621 # Numeric OID definition
8622         style.asn1.4=$(style.anjuta.definition)
8623 # Non OID numbers
8624         style.asn1.5=$(style.anjuta.number)
8625 # Keywords
8626         style.asn1.6=$(style.anjuta.keyword)
8627 # Attributes
8628         style.asn1.7=$(style.anjuta.attribute)
8629 # Descriptors
8630         style.asn1.8=$(style.anjuta.localkeyword)
8631 # Types
8632         style.asn1.9=$(style.anjuta.syskeyword)
8633 # Operators
8634         style.asn1.10=$(style.anjuta.operator)
8638 ###############################################################################
8639 # Style for au3 from file au3.properties
8641 # White space
8642         style.au3.0=$(style.anjuta.whitespace)
8643 # Comment block
8644         style.au3.1=$(style.anjuta.comment)
8645 # Comment stream
8646         style.au3.2=$(style.anjuta.comment)
8647 # Number
8648         style.au3.3=$(style.anjuta.number)
8649 # Function
8650         style.au3.4=$(style.anjuta.function)
8651 # Keyword
8652         style.au3.5=$(style.anjuta.keyword)
8653 # Macro
8654         style.au3.6=$(style.anjuta.localkeyword)
8655 # String
8656         style.au3.7=$(style.anjuta.string)
8657 # Operator
8658         style.au3.8=$(style.anjuta.operator)
8659 # Variable
8660         style.au3.9=$(style.anjuta.identifier)
8661 # Send key
8662         style.au3.10=$(style.anjuta.char)
8663 # Pre-Processor
8664         style.au3.11=$(style.anjuta.preprocessor)
8665 # Special
8666         style.au3.12=$(style.anjuta.attribute)
8667 # Abbrev-Expand
8668         style.au3.13=$(style.anjuta.regex)
8669 # COM Object
8670         style.au3.14=$(style.anjuta.attribute)
8671 # Standard UDF
8672         style.au3.15=$(style.anjuta.syskeyword)
8676 ###############################################################################
8677 # Style for ave from file ave.properties
8679 # White space: Visible only in View Whitespace mode (or if it has a back colour)
8680         style.ave.0=$(style.anjuta.whitespace)
8681 # Comment
8682         style.ave.1=$(style.anjuta.comment)
8683 # Number
8684         style.ave.2=$(style.anjuta.number)
8685 # Keyword
8686         style.ave.3=$(style.anjuta.keyword)
8687 # String
8688         style.ave.6=$(style.anjuta.string)
8689 # Enumeration
8690         style.ave.7=$(style.anjuta.definition)
8691 # End of line where string is not closed
8692         style.ave.8=$(style.anjuta.unclosed)
8693 # Identifier (everything else...)
8694         style.ave.9=$(style.anjuta.identifier)
8695 # Operators
8696         style.ave.10=$(style.anjuta.operator)
8697 # SCE_AVE_WORD1 allocated but unused
8698         style.ave.11=$(style.anjuta.preprocessor)
8699 # Other keywords (bozo test colors :-)
8700         style.ave.12=$(style.anjuta.localkeyword)
8702         style.ave.13=$(style.anjuta.syskeyword)
8704         style.ave.14=$(style.anjuta.keyword)
8706         style.ave.15=$(style.anjuta.keyword)
8708         style.ave.16=$(style.anjuta.keyword)
8712 ###############################################################################
8713 # Style for avs from file avs.properties
8715 # White space: Visible only in View Whitespace mode (or if it has a back colour)
8716         style.avs.0=$(style.anjuta.whitespace)
8717 # Comment: /* */. Use fixed font to keep boxed comments as boxes
8718         style.avs.1=$(style.anjuta.comment)
8719 # Comment: [* *]. Use fixed font to keep boxed comments as boxes
8720         style.avs.2=$(style.anjuta.comment)
8721 # Line Comment: #. Proportionnal font is generally OK here
8722         style.avs.3=$(style.anjuta.comment)
8723 # Number
8724         style.avs.4=$(style.anjuta.number)
8725 # Operators
8726         style.avs.5=$(style.anjuta.operator)
8727 # Double quoted string
8728         style.avs.7=$(style.anjuta.string)
8729 # String with three double quotes
8730         style.avs.8=$(style.anjuta.regex)
8731 # Keyword
8732         style.avs.9=$(style.anjuta.keyword)
8733 # Filter
8734         style.avs.10=$(style.anjuta.localkeyword)
8735 # Plugin
8736         style.avs.11=$(style.anjuta.syskeyword)
8737 # Function
8738         style.avs.12=$(style.anjuta.function)
8739 # Clip properties
8740         style.avs.13=$(style.anjuta.attribute)
8741 # User defined
8742         style.avs.14=$(style.anjuta.extrakeyword)
8746 ###############################################################################
8747 # Style for baan from file baan.properties
8749 # White space
8750         style.baan.0=$(style.anjuta.whitespace)
8751 # Comment
8752         style.baan.1=$(style.anjuta.comment)
8753 # Doc comment
8754         style.baan.2=$(style.anjuta.comment)
8755 # Number
8756         style.baan.3=$(style.anjuta.number)
8757 # Keyword ~ Reserved Words
8758         style.baan.4=$(style.anjuta.keyword)
8759 # Double quoted string
8760         style.baan.5=$(style.anjuta.string)
8761 # Preprocessor
8762         style.baan.6=$(style.anjuta.preprocessor)
8763 # Operators
8764         style.baan.7=$(style.anjuta.operator)
8765 # Identifiers
8766         style.baan.8=$(style.anjuta.identifier)
8767 # End of line where string is not closed
8768         style.baan.9=$(style.anjuta.unclosed)
8769 # Keywords2 ~ Functions
8770         style.baan.10=$(style.anjuta.localkeyword)
8771 # Keywords3 ~ Functions Abridged
8772         style.baan.11=$(style.anjuta.localkeyword)
8773 # Keywords4 ~ Sections
8774         style.baan.12=$(style.anjuta.definition)
8775 # Keywords5 ~ Predefined Variables
8776         style.baan.13=$(style.anjuta.char)
8777 # Keywords6 ~ Attributes Predefined
8778         style.baan.14=$(style.anjuta.attribute)
8779 # Keywords7
8780         style.baan.15=$(style.anjuta.extrakeyword)
8781 # Keywords8
8782         style.baan.16=$(style.anjuta.extrakeyword)
8783 # Keywords9
8784         style.baan.17=$(style.anjuta.extrakeyword)
8785 # TableDef
8786         style.baan.18=$(style.anjuta.definition)
8787 # TableSQL
8788         style.baan.19=$(style.anjuta.definition)
8789 # Functions
8790         style.baan.20=$(style.anjuta.function)
8791 # DomainDef
8792         style.baan.21=$(style.anjuta.function)
8793 # FunctionDef
8794         style.baan.22=$(style.anjuta.function)
8795 # ObjectDef used in #include and #pragma used dll
8796         style.baan.23=$(style.anjuta.preprocessor)
8797 # DefineDef used in #define 
8798         style.baan.24=$(style.anjuta.preprocessor)
8802 ###############################################################################
8803 # Style for bash from file perl.properties
8805 # White space
8806         style.bash.0=$(style.anjuta.whitespace)
8807 # Error
8808         style.bash.1=$(style.anjuta.error)
8809 # Comment
8810         style.bash.2=$(style.anjuta.comment)
8811 # Number
8812         style.bash.3=$(style.anjuta.number)
8813 # Keyword
8814         style.bash.4=$(style.anjuta.keyword)
8815 # Double quoted string
8816         style.bash.5=$(style.anjuta.string)
8817 # Single quoted string
8818         style.bash.6=$(style.anjuta.char)
8819 # Operators
8820         style.bash.7=$(style.anjuta.operator)
8821 # Identifiers (functions, etc.)
8822         style.bash.8=$(style.anjuta.function)
8823 # Scalars: $var
8824         style.bash.9=$(style.anjuta.identifier)
8825 # Parameter expansion: ${var}
8826         style.bash.10=$(style.anjuta.identifier)
8827 # Back Ticks
8828         style.bash.11=$(style.anjuta.raw)
8829 # Here-doc (delimiter)
8830         style.bash.12=$(style.anjuta.comment)
8831 # Here-doc (single quoted, q)
8832         style.bash.13=$(style.anjuta.comment)
8836 ###############################################################################
8837 # Style for batch from file others.properties
8839 # Default
8840         style.batch.0=$(style.anjuta.normal)
8841 # Comment (rem or ::)
8842         style.batch.1=$(style.anjuta.comment)
8843 # Keywords
8844         style.batch.2=$(style.anjuta.keyword)
8845 # Label (line beginning with ':')
8846         style.batch.3=$(style.anjuta.function)
8847 # Hide command character ('@')
8848         style.batch.4=$(style.anjuta.preprocessor)
8849 # External commands
8850         style.batch.5=$(style.anjuta.localkeyword)
8851 # Variable: %%x (x is almost whatever, except space and %), %n (n in [0-9]), %EnvironmentVar%
8852         style.batch.6=$(style.anjuta.identifier)
8853 # Operator: * ? < > |
8854         style.batch.7=$(style.anjuta.operator)
8858 ###############################################################################
8859 # Style for blitzbasic from file blitzbasic.properties
8861 # Default
8862         style.blitzbasic.0=$(style.anjuta.normal)
8863 # Comment
8864         style.blitzbasic.1=$(style.anjuta.comment)
8865 # Number
8866         style.blitzbasic.2=$(style.anjuta.number)
8867 # Keyword1
8868         style.blitzbasic.3=$(style.anjuta.keyword)
8869 # String
8870         style.blitzbasic.4=$(style.anjuta.string)
8871 # Operator
8872         style.blitzbasic.6=$(style.anjuta.operator)
8873 # Identifier
8874         style.blitzbasic.7=$(style.anjuta.identifier)
8875 # Keyword2
8876         style.blitzbasic.10=$(style.anjuta.localkeyword)
8877 # Keyword3
8878         style.blitzbasic.11=$(style.anjuta.syskeyword)
8879 # Keyword4
8880         style.blitzbasic.12=$(style.anjuta.extrakeyword)
8881 # Label
8882         style.blitzbasic.15=$(style.anjuta.function)
8883 # Error
8884         style.blitzbasic.16=$(style.anjuta.error)
8885 # HexNumber
8886         style.blitzbasic.17=$(style.anjuta.number)
8887 # BinNumber
8888         style.blitzbasic.18=$(style.anjuta.number)
8892 ###############################################################################
8893 # Style for bullant from file bullant.properties
8895 # White space
8896         style.bullant.0=$(style.anjuta.whitespace)
8897 # Comment
8898         style.bullant.1=$(style.anjuta.comment)
8899 # Line Comment
8900         style.bullant.2=$(style.anjuta.comment)
8901 # Doc comment
8902         style.bullant.3=$(style.anjuta.comment)
8903 # Number
8904         style.bullant.4=$(style.anjuta.number)
8905 # Keyword
8906         style.bullant.5=$(style.anjuta.keyword)
8907 # Double quoted string
8908         style.bullant.6=$(style.anjuta.string)
8909 # Single quoted string
8910         style.bullant.7=$(style.anjuta.char)
8911 # Symbols
8912         style.bullant.8=$(style.anjuta.operator)
8913 # Preprocessor
8914         style.bullant.9=$(style.anjuta.preprocessor)
8918 ###############################################################################
8919 # Style for caml from file caml.properties
8921 # White space
8922         style.caml.0=$(style.anjuta.whitespace)
8923 #style.caml.2=
8924         style.caml.2=$(style.anjuta.definition)
8925 # Keywords (builtin language-defined keywords)
8926         style.caml.3=$(style.anjuta.keyword)
8927 #style.caml.4=
8928         style.caml.4=$(style.anjuta.localkeyword)
8929 #style.caml.5=
8930         style.caml.5=$(style.anjuta.syskeyword)
8931 # Linenum directive
8932         style.caml.6=$(style.anjuta.preprocessor)
8933 # Operators
8934         style.caml.7=$(style.anjuta.operator)
8935 # Number
8936         style.caml.8=$(style.anjuta.number)
8937 # Single quoted string (character constant)
8938         style.caml.9=$(style.anjuta.char)
8939 #style.caml.10=
8940         style.caml.10=$(style.anjuta.regex)
8941 # Double quoted string (string constant)
8942         style.caml.11=$(style.anjuta.string)
8943 # Comment (NOT nested)
8944         style.caml.12=$(style.anjuta.comment)
8945 # Comment (SINGLY nested)
8946         style.caml.13=$(style.anjuta.comment)
8947 # Comment (DOUBLY nested)
8948         style.caml.14=$(style.anjuta.comment)
8949 # Comment (TRIPLY nested)
8950         style.caml.15=$(style.anjuta.comment)
8954 ###############################################################################
8955 # Style for cmake from file cmake.properties
8957 # Whitespace (SCE_CMAKE_DEFAULT)
8958         style.cmake.0=$(style.anjuta.whitespace)
8959 # Comment (SCE_CMAKE_COMMENT)
8960         style.cmake.1=$(style.anjuta.comment)
8961 # String double quote (SCE_CMAKE_STRINGDQ)
8962         style.cmake.2=$(style.anjuta.string)
8963 # String left quote (SCE_CMAKE_STRINGLQ)
8964         style.cmake.3=$(style.anjuta.char)
8965 # String right quote (SCE_CMAKE_STRINGRQ)
8966         style.cmake.4=$(style.anjuta.char)
8967 # Function (SCE_CMAKE_COMMANDS)
8968         style.cmake.5=$(style.anjuta.function)
8969 # Variable (SCE_CMAKE_ARGUMENTS)
8970         style.cmake.6=$(style.anjuta.identifier)
8971 # Label (SCE_CMAKE_VARIABLE)
8972         style.cmake.7=$(style.anjuta.definition)
8973 # User Defined (SCE_CMAKE_USERDEFINED)
8974         style.cmake.8=$(style.anjuta.extrakeyword)
8975 # Section (SCE_CMAKE_WHILEDEF)
8976         style.cmake.9=$(style.anjuta.keyword)
8977 # Sub section (SCE_CMAKE_FOREACHDEF)
8978         style.cmake.10=$(style.anjuta.localkeyword)
8979 # If def (SCE_CMAKE_IFDEFINEDEF)
8980         style.cmake.11=$(style.anjuta.preprocessor)
8981 # Macro def (SCE_CMAKE_MACRODEF)
8982         style.cmake.12=$(style.anjuta.preprocessor)
8983 # Variable within string (SCE_CMAKE_STRINGVAR)
8984         style.cmake.13=$(style.anjuta.identifier)
8985 # Numbers (SCE_CMAKE_NUMBER)
8986         style.cmake.14=$(style.anjuta.number)
8990 ###############################################################################
8991 # Style for coffeescript from file coffeescript.properties
8993 # White space
8994         style.coffeescript.0=$(style.anjuta.whitespace)
8995 # SCE_COFFEESCRIPT_COMMENT allocated but unused
8996         style.coffeescript.1=$(style.anjuta.comment)
8997 # Line Comment
8998         style.coffeescript.2=$(style.anjuta.comment)
8999 # SCE_COFFEESCRIPT_COMMENTDOC allocated but unused
9000         style.coffeescript.3=$(style.anjuta.comment)
9001 # Number
9002         style.coffeescript.4=$(style.anjuta.number)
9003 # Keyword
9004         style.coffeescript.5=$(style.anjuta.keyword)
9005 # Double quoted string
9006         style.coffeescript.6=$(style.anjuta.string)
9007 # Single quoted string
9008         style.coffeescript.7=$(style.anjuta.char)
9009 # SCE_COFFEESCRIPT_UUID allocated but unused
9010         style.coffeescript.8=$(style.anjuta.attribute)
9011 # SCE_COFFEESCRIPT_PREPROCESSOR allocated but unused
9012         style.coffeescript.9=$(style.anjuta.preprocessor)
9013 # Operators
9014         style.coffeescript.10=$(style.anjuta.operator)
9015 # SCE_COFFEESCRIPT_STRINGEOL allocated but unused
9016         style.coffeescript.12=$(style.anjuta.string)
9017 # SCE_COFFEESCRIPT_VERBATIM allocated but unused
9018         style.coffeescript.13=$(style.anjuta.string)
9019 # Regular expressions
9020         style.coffeescript.14=$(style.anjuta.regex)
9021 # SCE_COFFEESCRIPT_COMMENTLINEDOC allocated but unused
9022         style.coffeescript.15=$(style.anjuta.comment)
9023 # Keywords2
9024         style.coffeescript.16=$(style.anjuta.localkeyword)
9025 # SCE_COFFEESCRIPT_COMMENTDOCKEYWORD allocated but unused
9026         style.coffeescript.17=$(style.anjuta.comment)
9027 # SCE_COFFEESCRIPT_COMMENTDOCKEYWORDERROR allocated but unused
9028         style.coffeescript.18=$(style.anjuta.comment)
9029 # Global class
9030         style.coffeescript.19=$(style.anjuta.definition)
9031 # SCE_COFFEESCRIPT_STRINGRAW allocated but unused
9032         style.coffeescript.20=$(style.anjuta.string)
9033 # SCE_COFFEESCRIPT_TRIPLEVERBATIM allocated but unused
9034         style.coffeescript.21=$(style.anjuta.string)
9035 # Comment block ###
9036         style.coffeescript.22=$(style.anjuta.comment)
9037 # Verbose REGEX
9038         style.coffeescript.23=$(style.anjuta.regex)
9039 # Verbose REGEX comment
9040         style.coffeescript.24=$(style.anjuta.comment)
9041 # Iinstance property
9042         style.coffeescript.25=$(style.anjuta.attribute)
9046 ###############################################################################
9047 # Style for conf from file conf.properties
9049 # whitespace (SCE_CONF_DEFAULT)
9050         style.conf.0=$(style.anjuta.whitespace)
9051 # Comment (SCE_CONF_COMMENT)
9052         style.conf.1=$(style.anjuta.comment)
9053 # Number (SCE_CONF_NUMBER)
9054         style.conf.2=$(style.anjuta.number)
9055 # Apache Runtime Directive (SCE_CONF_DIRECTIVE)
9056         style.conf.3=$(style.anjuta.preprocessor)
9057 # extensions (like .gz, .tgz, .html) (SCE_CONF_EXTENSION)
9058         style.conf.4=$(style.anjuta.keyword)
9059 # parameters for Apache Runtime directives (SCE_CONF_PARAMETER)
9060         style.conf.5=$(style.anjuta.localkeyword)
9061 # Double quoted string (SCE_CONF_STRING)
9062         style.conf.6=$(style.anjuta.string)
9063 # Operators (SCE_CONF_OPERATOR)
9064         style.conf.7=$(style.anjuta.operator)
9065 # IP address (SCE_CONF_IP)
9066         style.conf.8=$(style.anjuta.number)
9067 # identifier (SCE_CONF_IDENTIFIER)
9068         style.conf.9=$(style.anjuta.identifier)
9072 ###############################################################################
9073 # Style for cpp from file cpp.properties
9075 # White space
9076         style.cpp.0=$(style.anjuta.whitespace)
9077 # Comment: /* */.
9078         style.cpp.1=$(style.anjuta.comment)
9079 # Line Comment: //.
9080         style.cpp.2=$(style.anjuta.comment)
9081 # Doc comment: block comments beginning with /** or /*!
9082         style.cpp.3=$(style.anjuta.comment)
9083 # Number
9084         style.cpp.4=$(style.anjuta.number)
9085 # Keyword
9086         style.cpp.5=$(style.anjuta.keyword)
9087 # Double quoted string
9088         style.cpp.6=$(style.anjuta.string)
9089 # Single quoted string
9090         style.cpp.7=$(style.anjuta.char)
9091 # UUIDs (only in IDL)
9092         style.cpp.8=$(style.anjuta.identifier)
9093 # Preprocessor
9094         style.cpp.9=$(style.anjuta.preprocessor)
9095 # Operators
9096         style.cpp.10=$(style.anjuta.operator)
9097 # End of line where string is not closed
9098         style.cpp.12=$(style.anjuta.unclosed)
9099 # Verbatim strings for C#
9100         style.cpp.13=$(style.anjuta.raw)
9101 # Regular expressions for JavaScript
9102         style.cpp.14=$(style.anjuta.regex)
9103 # Doc Comment Line: line comments beginning with /// or //!.
9104         style.cpp.15=$(style.anjuta.comment)
9105 # Keywords2
9106         style.cpp.16=$(style.anjuta.localkeyword)
9107 # Comment keyword
9108         style.cpp.17=$(style.anjuta.comment)
9109 # Comment keyword error
9110         style.cpp.18=$(style.anjuta.comment)
9111 # Global class
9112         style.cpp.19=$(style.anjuta.syskeyword)
9113 # Raw strings for C++0x
9114         style.cpp.20=$(style.anjuta.string)
9115 # Triple-quoted strings for Vala
9116         style.cpp.21=$(style.anjuta.string)
9117 # Hash-quoted strings for Pike
9118         style.cpp.22=$(style.anjuta.string)
9119 # Preprocessor stream comment
9120         style.cpp.23=$(style.anjuta.preprocessor)
9121 # Preprocessor stream doc comment
9122         style.cpp.24=$(style.anjuta.preprocessor)
9123 # User defined literals
9124         style.cpp.25=$(style.anjuta.number)
9125 # Task Marker
9126         style.cpp.26=$(style.anjuta.attribute)
9127 # Escape sequence
9128         style.cpp.27=$(style.anjuta.string)
9129 # White space
9130         style.cpp.64=$(style.anjuta.whitespace)
9131 # Comment: /* */.
9132         style.cpp.65=$(style.anjuta.comment)
9133 # Line Comment: //.
9134         style.cpp.66=$(style.anjuta.comment)
9135 # Doc comment: block comments beginning with /** or /*!
9136         style.cpp.67=$(style.anjuta.comment)
9137 # Number
9138         style.cpp.68=$(style.anjuta.number)
9139 # Keyword
9140         style.cpp.69=$(style.anjuta.keyword)
9141 # Double quoted string
9142         style.cpp.70=$(style.anjuta.string)
9143 # Single quoted string
9144         style.cpp.71=$(style.anjuta.char)
9145 # UUIDs (only in IDL)
9146         style.cpp.72=$(style.anjuta.identifier)
9147 # Preprocessor
9148         style.cpp.73=$(style.anjuta.preprocessor)
9149 # Operators
9150         style.cpp.74=$(style.anjuta.operator)
9151 # Identifiers
9152         style.cpp.75=$(style.anjuta.identifier)
9153 # End of line where string is not closed
9154         style.cpp.76=$(style.anjuta.unclosed)
9155 # Verbatim strings for C#
9156         style.cpp.77=$(style.anjuta.string)
9157 # Regular expressions for JavaScript
9158         style.cpp.78=$(style.anjuta.regex)
9159 # Doc Comment Line: line comments beginning with /// or //!.
9160         style.cpp.79=$(style.anjuta.comment)
9161 # Keywords2
9162         style.cpp.80=$(style.anjuta.keyword)
9163 # Comment keyword
9164         style.cpp.81=$(style.anjuta.comment)
9165 # Comment keyword error
9166         style.cpp.82=$(style.anjuta.comment)
9167 # Raw strings for C++0x
9168         style.cpp.84=$(style.anjuta.string)
9169 # Triple-quoted strings for Vala
9170         style.cpp.85=$(style.anjuta.string)
9171 # Hash-quoted strings for Pike
9172         style.cpp.86=$(style.anjuta.string)
9173 # Preprocessor stream comment
9174         style.cpp.87=$(style.anjuta.preprocessor)
9175 # Preprocessor stream doc comment
9176         style.cpp.88=$(style.anjuta.preprocessor)
9177 # User defined literals
9178         style.cpp.89=$(style.anjuta.number)
9179 # Task Marker
9180         style.cpp.90=$(style.anjuta.attribute)
9184 ###############################################################################
9185 # Style for csound from file csound.properties
9187 # Default
9188         style.csound.0=$(style.anjuta.normal)
9189 # Comment
9190         style.csound.1=$(style.anjuta.comment)
9191 # Number
9192         style.csound.2=$(style.anjuta.number)
9193 # Operator
9194         style.csound.3=$(style.anjuta.operator)
9195 # Instr
9196         style.csound.4=$(style.anjuta.keyword)
9197 # Opcode
9198         style.csound.6=$(style.anjuta.localkeyword)
9199 # Header statement
9200         style.csound.7=$(style.anjuta.syskeyword)
9201 # User keywords
9202         style.csound.8=$(style.anjuta.extrakeyword)
9203 # comment block
9204         style.csound.9=$(style.anjuta.comment)
9205 # Parameter
9206         style.csound.10=$(style.anjuta.attribute)
9207 # A-Rate variable
9208         style.csound.11=$(style.anjuta.identifier)
9209 # K-Rate variable
9210         style.csound.12=$(style.anjuta.identifier)
9211 # I-Rate variable
9212         style.csound.13=$(style.anjuta.identifier)
9213 # Global variable
9214         style.csound.14=$(style.anjuta.identifier)
9215 # End of line where string is not closed
9216         style.csound.15=$(style.anjuta.identifier)
9220 ###############################################################################
9221 # Style for css from file css.properties
9223 # White space: Visible only in View Whitespace mode (or if it has a back colour)
9224         style.css.0=$(style.anjuta.whitespace)
9225 # Selector (HTML tag)
9226         style.css.1=$(style.anjuta.keyword)
9227 # Pseudo class (HtmlTag:pseudoClass) see "keywords2" above
9228         style.css.3=$(style.anjuta.localkeyword)
9229 # Unknown Pseudo class
9230         style.css.4=$(style.anjuta.syskeyword)
9231 # Operator
9232         style.css.5=$(style.anjuta.operator)
9233 # CSS1 Property, see keywords
9234         style.css.6=$(style.anjuta.attribute)
9235 # Unknown Property
9236         style.css.7=$(style.anjuta.attribute)
9237 # Value
9238         style.css.8=$(style.anjuta.string)
9239 # Comment
9240         style.css.9=$(style.anjuta.comment)
9241 # ID selector (#IdSel)
9242         style.css.10=$(style.anjuta.number)
9243 # "!important"
9244         style.css.11=$(style.anjuta.error)
9245 # At-rule (@) except @media
9246         style.css.12=$(style.anjuta.definition)
9247 # Double quoted strings
9248         style.css.13=$(style.anjuta.string)
9249 # Single quoted strings
9250         style.css.14=$(style.anjuta.char)
9251 # CSS2 Property, see keywords3
9252         style.css.15=$(style.anjuta.attribute)
9253 # Attribute selection ([att='val'])
9254         style.css.16=$(style.anjuta.attribute)
9255 # CSS3 Property, see keywords4
9256         style.css.17=$(style.anjuta.syskeyword)
9257 # Pseudo elements, see keywords5
9258         style.css.18=$(style.anjuta.syskeyword)
9259 # Other CSS Property, see keywords6
9260         style.css.19=$(style.anjuta.syskeyword)
9261 # Other Pseudoclass, see keywords7
9262         style.css.20=$(style.anjuta.localkeyword)
9263 # Other Pseudoelement, see keywords8
9264         style.css.21=$(style.anjuta.localkeyword)
9265 # "@media"
9266         style.css.22=$(style.anjuta.identifier)
9267 # Variable in SCSS, LESS, or HSS
9268         style.css.23=$(style.anjuta.identifier)
9272 ###############################################################################
9273 # Style for d from file d.properties
9275 # 20, 21, 22 keywords 5, 6, and 7
9276         style.d.0=$(style.anjuta.whitespace)
9278         style.d.1=$(style.anjuta.comment)
9280         style.d.2=$(style.anjuta.comment)
9282         style.d.3=$(style.anjuta.comment)
9284         style.d.4=$(style.anjuta.comment)
9286         style.d.5=$(style.anjuta.number)
9288         style.d.6=$(style.anjuta.keyword)
9290         style.d.7=$(style.anjuta.localkeyword)
9292         style.d.8=$(style.anjuta.syskeyword)
9294         style.d.9=$(style.anjuta.extrakeyword)
9296         style.d.10=$(style.anjuta.string)
9298         style.d.11=$(style.anjuta.unclosed)
9300         style.d.12=$(style.anjuta.char)
9302         style.d.13=$(style.anjuta.operator)
9304         style.d.15=$(style.anjuta.comment)
9306         style.d.16=$(style.anjuta.comment)
9308         style.d.17=$(style.anjuta.comment)
9310         style.d.18=$(style.anjuta.string)
9312         style.d.19=$(style.anjuta.string)
9314         style.d.20=$(style.anjuta.keyword)
9316         style.d.21=$(style.anjuta.keyword)
9318         style.d.22=$(style.anjuta.keyword)
9322 ###############################################################################
9323 # Style for diff from file others.properties
9325 # Default
9326         style.diff.0=$(style.anjuta.normal)
9327 # Comment (part before "diff ..." or "--- ..." and , Only in ..., Binary file...)
9328         style.diff.1=$(style.anjuta.comment)
9329 # Command (diff ...)
9330         style.diff.2=$(style.anjuta.keyword)
9331 # Source file (--- ...) and Destination file (+++ ...)
9332         style.diff.3=$(style.anjuta.raw)
9333 # Position setting (@@ ...)
9334         style.diff.4=$(style.anjuta.number)
9335 # Line removal (-...)
9336         style.diff.5=$(style.anjuta.localkeyword)
9337 # Line addition (+...)
9338         style.diff.6=$(style.anjuta.syskeyword)
9339 # Line change (!...)
9340         style.diff.7=$(style.anjuta.extrakeyword)
9344 ###############################################################################
9345 # Style for ecl from file ecl.properties
9348         style.ecl.0=$(style.anjuta.normal)
9350         style.ecl.1=$(style.anjuta.comment)
9352         style.ecl.2=$(style.anjuta.comment)
9354         style.ecl.3=$(style.anjuta.number)
9356         style.ecl.4=$(style.anjuta.string)
9358         style.ecl.5=$(style.anjuta.definition)
9360         style.ecl.6=$(style.anjuta.operator)
9362         style.ecl.7=$(style.anjuta.char)
9364         style.ecl.8=$(style.anjuta.attribute)
9366         style.ecl.9=$(style.anjuta.preprocessor)
9368         style.ecl.10=$(style.anjuta.error)
9370         style.ecl.11=$(style.anjuta.identifier)
9372         style.ecl.12=$(style.anjuta.unclosed)
9374         style.ecl.13=$(style.anjuta.string)
9376         style.ecl.14=$(style.anjuta.regex)
9378         style.ecl.15=$(style.anjuta.comment)
9380         style.ecl.16=$(style.anjuta.keyword)
9382         style.ecl.17=$(style.anjuta.comment)
9384         style.ecl.18=$(style.anjuta.comment)
9386         style.ecl.19=$(style.anjuta.localkeyword)
9388         style.ecl.20=$(style.anjuta.syskeyword)
9390         style.ecl.21=$(style.anjuta.extrakeyword)
9392         style.ecl.22=$(style.anjuta.function)
9394         style.ecl.23=$(style.anjuta.comment)
9396         style.ecl.24=$(style.anjuta.attribute)
9398         style.ecl.25=$(style.anjuta.attribute)
9400         style.ecl.26=$(style.anjuta.attribute)
9402         style.ecl.27=$(style.anjuta.attribute)
9406 ###############################################################################
9407 # Style for eiffel from file eiffel.properties
9409 # Default
9410         style.eiffel.0=$(style.anjuta.whitespace)
9411 # Line comment
9412         style.eiffel.1=$(style.anjuta.comment)
9413 # Number
9414         style.eiffel.2=$(style.anjuta.number)
9415 # Keyword
9416         style.eiffel.3=$(style.anjuta.keyword)
9417 # String
9418         style.eiffel.4=$(style.anjuta.string)
9419 # Character
9420         style.eiffel.5=$(style.anjuta.char)
9421 # Operators
9422         style.eiffel.6=$(style.anjuta.operator)
9423 # End of line where string is not closed
9424         style.eiffel.8=$(style.anjuta.unclosed)
9428 ###############################################################################
9429 # Style for eiffelkw from file eiffel.properties
9432         style.eiffelkw.0=$(style.anjuta.whitespace)
9434         style.eiffelkw.1=$(style.anjuta.comment)
9436         style.eiffelkw.2=$(style.anjuta.number)
9438         style.eiffelkw.3=$(style.anjuta.keyword)
9440         style.eiffelkw.4=$(style.anjuta.string)
9442         style.eiffelkw.5=$(style.anjuta.char)
9444         style.eiffelkw.6=$(style.anjuta.operator)
9446         style.eiffelkw.7=$(style.anjuta.identifier)
9448         style.eiffelkw.8=$(style.anjuta.unclosed)
9452 ###############################################################################
9453 # Style for erlang from file erlang.properties
9455 # Default style
9456         style.erlang.0=$(style.anjuta.whitespace)
9457 # Default comment
9458         style.erlang.1=$(style.anjuta.comment)
9459 # Variable
9460         style.erlang.2=$(style.anjuta.identifier)
9461 # Number
9462         style.erlang.3=$(style.anjuta.number)
9463 # Reserved words
9464         style.erlang.4=$(style.anjuta.keyword)
9465 # String
9466         style.erlang.5=$(style.anjuta.string)
9467 # Operators
9468         style.erlang.6=$(style.anjuta.operator)
9469 # Atom
9470         style.erlang.7=$(style.anjuta.attribute)
9471 # Function name
9472         style.erlang.8=$(style.anjuta.function)
9473 # Character
9474         style.erlang.9=$(style.anjuta.char)
9475 # Macro
9476         style.erlang.10=$(style.anjuta.preprocessor)
9477 # Record
9478         style.erlang.11=$(style.anjuta.definition)
9479 # Preprocessor
9480         style.erlang.12=$(style.anjuta.operator)
9481 # Node name
9482         style.erlang.13=$(style.anjuta.identifier)
9483 # Function comment
9484         style.erlang.14=$(style.anjuta.comment)
9485 # Module comment
9486         style.erlang.15=$(style.anjuta.comment)
9487 # Documentation helper in comment
9488         style.erlang.16=$(style.anjuta.comment)
9489 # Documentation macro in comment
9490         style.erlang.17=$(style.anjuta.comment)
9491 # Atom quoted
9492         style.erlang.18=$(style.anjuta.attribute)
9493 # Macro quoted
9494         style.erlang.19=$(style.anjuta.preprocessor)
9495 # Record quoted
9496         style.erlang.20=$(style.anjuta.definition)
9497 # Node name quoted
9498         style.erlang.21=$(style.anjuta.identifier)
9499 # Built-in functions
9500         style.erlang.22=$(style.anjuta.syskeyword)
9501 # Module name
9502         style.erlang.23=$(style.anjuta.definition)
9503 # Module attributes
9504         style.erlang.24=$(style.anjuta.definition)
9505 # Unknown: error
9506         style.erlang.31=$(style.anjuta.error)
9510 ###############################################################################
9511 # Style for errorlist from file others.properties
9513 # Default
9514         style.errorlist.0=$(style.anjuta.error)
9515 # python Error
9516         style.errorlist.1=$(style.anjuta.error)
9517 # gcc Error
9518         style.errorlist.2=$(style.anjuta.error)
9519 # Microsoft Error
9520         style.errorlist.3=$(style.anjuta.error)
9521 # command or return status
9522         style.errorlist.4=$(style.anjuta.number)
9523 # Borland error and warning messages
9524         style.errorlist.5=$(style.anjuta.error)
9525 # perl error and warning messages
9526         style.errorlist.6=$(style.anjuta.error)
9527 # .NET tracebacks
9528         style.errorlist.7=$(style.anjuta.error)
9529 # Lua error and warning messages
9530         style.errorlist.8=$(style.anjuta.error)
9531 # ctags
9532         style.errorlist.9=$(style.anjuta.error)
9533 # diff changed !
9534         style.errorlist.10=$(style.anjuta.extrakeyword)
9535 # diff addition +
9536         style.errorlist.11=$(style.anjuta.syskeyword)
9537 # diff deletion -
9538         style.errorlist.12=$(style.anjuta.localkeyword)
9539 # diff message ---
9540         style.errorlist.13=$(style.anjuta.raw)
9541 # PHP error
9542         style.errorlist.14=$(style.anjuta.error)
9543 # Essential Lahey Fortran 90 error
9544         style.errorlist.15=$(style.anjuta.error)
9545 # Intel Fortran Compiler error
9546         style.errorlist.16=$(style.anjuta.error)
9547 # Intel Fortran Compiler v8.0 error/warning
9548         style.errorlist.17=$(style.anjuta.error)
9549 # Absoft Pro Fortran 90/95 v8.2 error or warning
9550         style.errorlist.18=$(style.anjuta.error)
9551 # HTML Tidy
9552         style.errorlist.19=$(style.anjuta.error)
9553 # Java runtime stack trace
9554         style.errorlist.20=$(style.anjuta.error)
9555 # Text matched with find in files and message part of GCC errors
9556         style.errorlist.21=$(style.anjuta.normal)
9557 # GCC showing include path to following error
9558         style.errorlist.22=$(style.anjuta.error)
9559 # Escape sequence
9560         style.errorlist.23=$(style.anjuta.string)
9561 # Escape sequence unknown
9562         style.errorlist.24=$(style.anjuta.string)
9563 # Basic colours
9564         style.errorlist.40=fore:#000000,$(error.background)
9566         style.errorlist.41=fore:#800000,$(error.background)
9568         style.errorlist.42=fore:#008000,$(error.background)
9570         style.errorlist.43=fore:#808000,$(error.background)
9572         style.errorlist.44=fore:#000080,$(error.background)
9574         style.errorlist.45=fore:#800080,$(error.background)
9576         style.errorlist.46=fore:#008080,$(error.background)
9578         style.errorlist.47=fore:#A0A0A0,$(error.background)
9579 # Intense colours
9580         style.errorlist.48=fore:#000000,bold,$(error.background)
9582         style.errorlist.49=fore:#800000,bold,$(error.background)
9584         style.errorlist.50=fore:#008000,bold,$(error.background)
9586         style.errorlist.51=fore:#808000,bold,$(error.background)
9588         style.errorlist.52=fore:#000080,bold,$(error.background)
9590         style.errorlist.53=fore:#800080,bold,$(error.background)
9592         style.errorlist.54=fore:#008080,bold,$(error.background)
9594         style.errorlist.55=fore:#A0A0A0,bold,$(error.background)
9598 ###############################################################################
9599 # Style for escript from file escript.properties
9601 # Default
9602         style.escript.0=$(style.anjuta.normal)
9603 # Comment
9604         style.escript.1=$(style.anjuta.comment)
9605 # Line Comment
9606         style.escript.2=$(style.anjuta.comment)
9607 # Doc comment
9608         style.escript.3=$(style.anjuta.comment)
9609 # Number
9610         style.escript.4=$(style.anjuta.number)
9611 # Keyword
9612         style.escript.5=$(style.anjuta.keyword)
9613 # Double quoted string
9614         style.escript.6=$(style.anjuta.string)
9615 # Operators
9616         style.escript.7=$(style.anjuta.operator)
9617 # Braces
9618         style.escript.9=$(style.anjuta.operator)
9619 # Keywords2
9620         style.escript.10=$(style.anjuta.localkeyword)
9621 # Keywords3
9622         style.escript.11=$(style.anjuta.syskeyword)
9626 ###############################################################################
9627 # Style for f77 from file fortran.properties
9630         style.f77.0=$(style.anjuta.whitespace)
9632         style.f77.1=$(style.anjuta.comment)
9634         style.f77.2=$(style.anjuta.number)
9636         style.f77.3=$(style.anjuta.char)
9638         style.f77.4=$(style.anjuta.string)
9640         style.f77.5=$(style.anjuta.unclosed)
9642         style.f77.6=$(style.anjuta.operator)
9644         style.f77.8=$(style.anjuta.keyword)
9646         style.f77.9=$(style.anjuta.localkeyword)
9648         style.f77.10=$(style.anjuta.syskeyword)
9650         style.f77.11=$(style.anjuta.preprocessor)
9652         style.f77.12=$(style.anjuta.operator)
9654         style.f77.13=$(style.anjuta.definition)
9656         style.f77.14=$(style.anjuta.regex)
9660 ###############################################################################
9661 # Style for flagship from file flagship.properties
9663 # Comment * ...
9664         style.flagship.1=$(style.anjuta.comment)
9665 # Comment Line && ...
9666         style.flagship.2=$(style.anjuta.comment)
9667 # Comment Doc /* ... */
9668         style.flagship.3=$(style.anjuta.comment)
9669 # Comment Line Doc // ...
9670         style.flagship.4=$(style.anjuta.comment)
9671 # Comment keyword
9672         style.flagship.5=$(style.anjuta.comment)
9673 # Comment keyword error
9674         style.flagship.6=$(style.anjuta.comment)
9675 # Keyword - Commands
9676         style.flagship.7=$(style.anjuta.keyword)
9677 # keywords 2 - Std Library Functions
9678         style.flagship.8=$(style.anjuta.localkeyword)
9679 # keywords 3 - function, procedure, return, exit
9680         style.flagship.9=$(style.anjuta.syskeyword)
9681 # keywords 4 - Class (oop)
9682         style.flagship.10=$(style.anjuta.extrakeyword)
9683 # Number
9684         style.flagship.11=$(style.anjuta.number)
9685 # String
9686         style.flagship.12=$(style.anjuta.string)
9687 # Preprocessor (directives)
9688         style.flagship.13=$(style.anjuta.preprocessor)
9689 # Operator
9690         style.flagship.14=$(style.anjuta.operator)
9691 # Date
9692         style.flagship.16=$(style.anjuta.number)
9693 # STRINGEOL - End of line where string is not closed
9694         style.flagship.17=$(style.anjuta.unclosed)
9695 # Constant nil .t. .f.
9696         style.flagship.18=$(style.anjuta.number)
9697 # Word operator .and. .or. .not.
9698         style.flagship.19=$(style.anjuta.operator)
9699 # Comment Doc C
9700         style.flagship.22=$(style.anjuta.comment)
9701 # Comment Line Doc C
9702         style.flagship.23=$(style.anjuta.comment)
9703 # Keyword C
9704         style.flagship.24=$(style.anjuta.keyword)
9705 # Std Library Functions C
9706         style.flagship.25=$(style.anjuta.syskeyword)
9707 # Number C
9708         style.flagship.26=$(style.anjuta.number)
9709 # String C
9710         style.flagship.27=$(style.anjuta.string)
9711 # Preprocessor C
9712         style.flagship.28=$(style.anjuta.preprocessor)
9713 # Operator C
9714         style.flagship.29=$(style.anjuta.operator)
9715 # STRINGEOL C
9716         style.flagship.31=$(style.anjuta.unclosed)
9720 ###############################################################################
9721 # Style for forth from file forth.properties
9723 # whitespace (SCE_FORTH_DEFAULT)
9724         style.forth.0=$(style.anjuta.normal)
9725 # Comment (SCE_FORTH_COMMENT)
9726         style.forth.1=$(style.anjuta.comment)
9727 # ML comment (SCE_FORTH_COMMENT_ML)
9728         style.forth.2=$(style.anjuta.comment)
9729 # ML comment (SCE_FORTH_IDENTIFIER)
9730         style.forth.3=$(style.anjuta.comment)
9731 # control (SCE_FORTH_CONTROL)
9732         style.forth.4=$(style.anjuta.preprocessor)
9733 # Keywords (SCE_FORTH_KEYWORD)
9734         style.forth.5=$(style.anjuta.keyword)
9735 # defwords (SCE_FORTH_DEFWORD)
9736         style.forth.6=$(style.anjuta.localkeyword)
9737 # preword1 (SCE_FORTH_PREWORD1)
9738         style.forth.7=$(style.anjuta.syskeyword)
9739 # preword2 (SCE_FORTH_PREWORD2)
9740         style.forth.8=$(style.anjuta.extrakeyword)
9741 # number (SCE_FORTH_NUMBER)
9742         style.forth.9=$(style.anjuta.number)
9743 # Double quoted string (SCE_FORTH_STRING)
9744         style.forth.10=$(style.anjuta.string)
9745 # locale
9746         style.forth.11=$(style.anjuta.char)
9750 ###############################################################################
9751 # Style for fortran from file fortran.properties
9753 # Default
9754         style.fortran.0=$(style.anjuta.whitespace)
9755 # Comment
9756         style.fortran.1=$(style.anjuta.comment)
9757 # Number
9758         style.fortran.2=$(style.anjuta.number)
9759 # Single quoted string
9760         style.fortran.3=$(style.anjuta.char)
9761 # Double quoted string
9762         style.fortran.4=$(style.anjuta.string)
9763 # End of line where string is not closed
9764         style.fortran.5=$(style.anjuta.unclosed)
9765 # Operators
9766         style.fortran.6=$(style.anjuta.operator)
9767 # Keywords
9768         style.fortran.8=$(style.anjuta.keyword)
9769 # Keywords2
9770         style.fortran.9=$(style.anjuta.localkeyword)
9771 # Keywords3
9772         style.fortran.10=$(style.anjuta.syskeyword)
9773 # Preprocessor
9774         style.fortran.11=$(style.anjuta.preprocessor)
9775 # Operators in .NAME. format
9776         style.fortran.12=$(style.anjuta.operator)
9777 # Labels
9778         style.fortran.13=$(style.anjuta.definition)
9779 # Continuation
9780         style.fortran.14=$(style.anjuta.regex)
9784 ###############################################################################
9785 # Style for freebasic from file freebasic.properties
9787 # Default
9788         style.freebasic.0=$(style.anjuta.normal)
9789 # Comment
9790         style.freebasic.1=$(style.anjuta.comment)
9791 # Number
9792         style.freebasic.2=$(style.anjuta.number)
9793 # Keyword1
9794         style.freebasic.3=$(style.anjuta.keyword)
9795 # String
9796         style.freebasic.4=$(style.anjuta.string)
9797 # Preprocessor
9798         style.freebasic.5=$(style.anjuta.preprocessor)
9799 # Operator
9800         style.freebasic.6=$(style.anjuta.operator)
9801 # Identifier
9802         style.freebasic.7=$(style.anjuta.identifier)
9803 # Keyword2
9804         style.freebasic.10=$(style.anjuta.localkeyword)
9805 # Keyword3
9806         style.freebasic.11=$(style.anjuta.syskeyword)
9807 # Keyword4
9808         style.freebasic.12=$(style.anjuta.extrakeyword)
9809 # Label
9810         style.freebasic.15=$(style.anjuta.function)
9811 # Error
9812         style.freebasic.16=$(style.anjuta.error)
9813 # HexNumber
9814         style.freebasic.17=$(style.anjuta.number)
9815 # BinNumber
9816         style.freebasic.18=$(style.anjuta.number)
9820 ###############################################################################
9821 # Style for gap from file gap.properties
9823 # White space
9824         style.gap.0=$(style.anjuta.whitespace)
9825 # Keywords
9826         style.gap.2=$(style.anjuta.keyword)
9827 # Keywords 2
9828         style.gap.3=$(style.anjuta.localkeyword)
9829 # Keywords 3
9830         style.gap.4=$(style.anjuta.syskeyword)
9831 # Keywords 4
9832         style.gap.5=$(style.anjuta.extrakeyword)
9833 # Strings
9834         style.gap.6=$(style.anjuta.string)
9835 # Characters
9836         style.gap.7=$(style.anjuta.char)
9837 # Operators
9838         style.gap.8=$(style.anjuta.operator)
9839 # Comment
9840         style.gap.9=$(style.anjuta.comment)
9841 # Numbers
9842         style.gap.10=$(style.anjuta.number)
9843 # End of line where string is not closed
9844         style.gap.11=$(style.anjuta.unclosed)
9848 ###############################################################################
9849 # Style for haskell from file haskell.properties
9851 # white space
9852         style.haskell.0=$(style.anjuta.whitespace)
9853 # keyword
9854         style.haskell.2=$(style.anjuta.keyword)
9855 # numbers
9856         style.haskell.3=$(style.anjuta.number)
9857 # string
9858         style.haskell.4=$(style.anjuta.string)
9859 # character
9860         style.haskell.5=$(style.anjuta.char)
9861 # class: error not implemented
9862         style.haskell.6=$(style.anjuta.error)
9863 # data: error not implemented
9864         style.haskell.9=$(style.anjuta.error)
9865 # import: error not implemented
9866         style.haskell.10=$(style.anjuta.error)
9867 # operator
9868         style.haskell.11=$(style.anjuta.operator)
9869 # instance: error not implemented
9870         style.haskell.12=$(style.anjuta.error)
9871 # line comment
9872         style.haskell.13=$(style.anjuta.comment)
9873 # block comment
9874         style.haskell.14=$(style.anjuta.comment)
9875 # block comment 2
9876         style.haskell.15=$(style.anjuta.comment)
9877 # block comment 3
9878         style.haskell.16=$(style.anjuta.comment)
9879 # pragma
9880         style.haskell.17=$(style.anjuta.preprocessor)
9881 # preprocessor
9882         style.haskell.18=$(style.anjuta.preprocessor)
9883 # End of line where string is not closed
9884         style.haskell.19=$(style.anjuta.error)
9885 # Reserved operator
9886         style.haskell.20=$(style.anjuta.operator)
9887 # Literate comment
9888         style.haskell.21=$(style.anjuta.comment)
9889 # Literate delimiter
9890         style.haskell.22=$(style.anjuta.number)
9894 ###############################################################################
9895 # Style for hypertext from file html.properties
9897 # Text
9898         style.hypertext.0=$(style.anjuta.normal)
9899 # Tags
9900         style.hypertext.1=$(style.anjuta.keyword)
9901 # Unknown Tags
9902         style.hypertext.2=$(style.anjuta.localkeyword)
9903 # Attributes
9904         style.hypertext.3=$(style.anjuta.attribute)
9905 # Unknown Attributes
9906         style.hypertext.4=$(style.anjuta.identifier)
9907 # Numbers
9908         style.hypertext.5=$(style.anjuta.number)
9909 # Double quoted strings
9910         style.hypertext.6=$(style.anjuta.string)
9911 # Single quoted strings
9912         style.hypertext.7=$(style.anjuta.char)
9913 # Other inside tag
9914         style.hypertext.8=$(style.anjuta.regex)
9915 # Comment
9916         style.hypertext.9=$(style.anjuta.comment)
9917 # Entities
9918         style.hypertext.10=$(style.anjuta.attribute)
9919 # XML style tag ends '/>'
9920         style.hypertext.11=$(style.anjuta.keyword)
9921 # XML identifier start '<?'
9922         style.hypertext.12=$(style.anjuta.keyword)
9923 # XML identifier end '?>'
9924         style.hypertext.13=$(style.anjuta.keyword)
9925 #  SCRIPT
9926         style.hypertext.14=$(style.anjuta.normal)
9927 # ASP <% ... %>
9928         style.hypertext.15=$(style.anjuta.keyword)
9929 # ASP <% ... %>
9930         style.hypertext.16=$(style.anjuta.keyword)
9931 # CDATA
9932         style.hypertext.17=$(style.anjuta.raw)
9933 # PHP
9934         style.hypertext.18=$(style.anjuta.preprocessor)
9935 # Unquoted values
9936         style.hypertext.19=$(style.anjuta.identifier)
9937 # JSP Comment <%-- ... --%>
9938         style.hypertext.20=$(style.anjuta.comment)
9939 # SGML tags <! ... >
9940         style.hypertext.21=$(style.anjuta.keyword)
9941 # SGML command
9942         style.hypertext.22=$(style.anjuta.keyword)
9943 # SGML 1st param
9944         style.hypertext.23=$(style.anjuta.attribute)
9945 # SGML double string
9946         style.hypertext.24=$(style.anjuta.string)
9947 # SGML single string
9948         style.hypertext.25=$(style.anjuta.char)
9949 # SGML error
9950         style.hypertext.26=$(style.anjuta.error)
9951 # SGML special (#xxxx type)
9952         style.hypertext.27=$(style.anjuta.attribute)
9953 # SGML entity
9954         style.hypertext.28=$(style.anjuta.attribute)
9955 # SGML comment
9956         style.hypertext.29=$(style.anjuta.comment)
9957 # SGML first parameter - lexer internal. It is an error if any text is in this style.
9958         style.hypertext.30=$(style.anjuta.preprocessor)
9959 # SGML block
9960         style.hypertext.31=$(style.anjuta.preprocessor)
9961 # JS Start - allows eol filled background to not start on same line as SCRIPT tag
9962         style.hypertext.40=$(style.anjuta.function)
9963 # JS Default
9964         style.hypertext.41=$(style.anjuta.normal)
9965 # JS Comment
9966         style.hypertext.42=$(style.anjuta.comment)
9967 # JS Line Comment
9968         style.hypertext.43=$(style.anjuta.comment)
9969 # JS Doc comment
9970         style.hypertext.44=$(style.anjuta.comment)
9971 # JS Number
9972         style.hypertext.45=$(style.anjuta.number)
9973 # JS Word
9974         style.hypertext.46=$(style.anjuta.identifier)
9975 # JS Keyword
9976         style.hypertext.47=$(style.anjuta.keyword)
9977 # JS Double quoted string
9978         style.hypertext.48=$(style.anjuta.string)
9979 # JS Single quoted string
9980         style.hypertext.49=$(style.anjuta.char)
9981 # JS Symbols
9982         style.hypertext.50=$(style.anjuta.operator)
9983 # JavaScript EOL
9984         style.hypertext.51=$(style.anjuta.function)
9985 # JavaScript RegEx
9986         style.hypertext.52=$(style.anjuta.regex)
9987 # JS Start - allows eol filled background to not start on same line as SCRIPT tag
9988         style.hypertext.55=$(style.anjuta.function)
9989 # JS Default
9990         style.hypertext.56=$(style.anjuta.normal)
9991 # JS Comment
9992         style.hypertext.57=$(style.anjuta.comment)
9993 # JS Line Comment
9994         style.hypertext.58=$(style.anjuta.comment)
9995 # JS Doc comment
9996         style.hypertext.59=$(style.anjuta.comment)
9997 # JS Number
9998         style.hypertext.60=$(style.anjuta.number)
9999 # JS Word
10000         style.hypertext.61=$(style.anjuta.identifier)
10001 # JS Keyword
10002         style.hypertext.62=$(style.anjuta.keyword)
10003 # JS Double quoted string
10004         style.hypertext.63=$(style.anjuta.string)
10005 # JS Single quoted string
10006         style.hypertext.64=$(style.anjuta.char)
10007 # JS Symbols
10008         style.hypertext.65=$(style.anjuta.operator)
10009 # JavaScript EOL
10010         style.hypertext.66=$(style.anjuta.function)
10011 # JavaScript RegEx
10012         style.hypertext.67=$(style.anjuta.regex)
10013 # Default
10014         style.hypertext.71=$(style.anjuta.normal)
10015 # Comment
10016         style.hypertext.72=$(style.anjuta.comment)
10017 # Number
10018         style.hypertext.73=$(style.anjuta.number)
10019 # KeyWord
10020         style.hypertext.74=$(style.anjuta.keyword)
10021 # String
10022         style.hypertext.75=$(style.anjuta.string)
10023 # Identifier
10024         style.hypertext.76=$(style.anjuta.identifier)
10025 # Unterminated string
10026         style.hypertext.77=$(style.anjuta.unclosed)
10027 # Default
10028         style.hypertext.81=$(style.anjuta.normal)
10029 # Comment
10030         style.hypertext.82=$(style.anjuta.comment)
10031 # Number
10032         style.hypertext.83=$(style.anjuta.number)
10033 # KeyWord
10034         style.hypertext.84=$(style.anjuta.keyword)
10035 # String
10036         style.hypertext.85=$(style.anjuta.string)
10037 # Identifier
10038         style.hypertext.86=$(style.anjuta.identifier)
10039 # Unterminated string
10040         style.hypertext.87=$(style.anjuta.unclosed)
10041 # Embedded Python
10042         style.hypertext.90=$(style.anjuta.whitespace)
10044         style.hypertext.91=$(style.anjuta.normal)
10045 # Comment
10046         style.hypertext.92=$(style.anjuta.comment)
10047 # Number
10048         style.hypertext.93=$(style.anjuta.number)
10049 # String
10050         style.hypertext.94=$(style.anjuta.string)
10051 # Single quoted string
10052         style.hypertext.95=$(style.anjuta.char)
10053 # Keyword
10054         style.hypertext.96=$(style.anjuta.keyword)
10055 # Triple quotes
10056         style.hypertext.97=$(style.anjuta.char)
10057 # Triple double quotes
10058         style.hypertext.98=$(style.anjuta.string)
10059 # Class name definition
10060         style.hypertext.99=$(style.anjuta.definition)
10061 # Function or method name definition
10062         style.hypertext.100=$(style.anjuta.function)
10063 # Operators
10064         style.hypertext.101=$(style.anjuta.operator)
10065 # Identifiers
10066         style.hypertext.102=$(style.anjuta.identifier)
10067 # PHP complex variable
10068         style.hypertext.104=$(style.anjuta.identifier)
10069 # ASP Python
10070         style.hypertext.105=$(style.anjuta.whitespace)
10072         style.hypertext.106=$(style.anjuta.normal)
10073 # Comment
10074         style.hypertext.107=$(style.anjuta.comment)
10075 # Number
10076         style.hypertext.108=$(style.anjuta.number)
10077 # String
10078         style.hypertext.109=$(style.anjuta.string)
10079 # Single quoted string
10080         style.hypertext.110=$(style.anjuta.char)
10081 # Keyword
10082         style.hypertext.111=$(style.anjuta.keyword)
10083 # Triple quotes
10084         style.hypertext.112=$(style.anjuta.char)
10085 # Triple double quotes
10086         style.hypertext.113=$(style.anjuta.string)
10087 # Class name definition
10088         style.hypertext.114=$(style.anjuta.definition)
10089 # Function or method name definition
10090         style.hypertext.115=$(style.anjuta.function)
10091 # Operators
10092         style.hypertext.116=$(style.anjuta.operator)
10093 # Identifiers
10094         style.hypertext.117=$(style.anjuta.identifier)
10095 # Default
10096         style.hypertext.118=$(style.anjuta.normal)
10097 # Double quoted String
10098         style.hypertext.119=$(style.anjuta.string)
10099 # Single quoted string
10100         style.hypertext.120=$(style.anjuta.char)
10101 # Keyword
10102         style.hypertext.121=$(style.anjuta.keyword)
10103 # Number
10104         style.hypertext.122=$(style.anjuta.number)
10105 # Variable
10106         style.hypertext.123=$(style.anjuta.identifier)
10107 # Comment
10108         style.hypertext.124=$(style.anjuta.comment)
10109 # One line comment
10110         style.hypertext.125=$(style.anjuta.comment)
10111 # PHP variable in double quoted string
10112         style.hypertext.126=$(style.anjuta.identifier)
10113 # PHP operator
10114         style.hypertext.127=$(style.anjuta.operator)
10118 ###############################################################################
10119 # Style for ihex from file hex.properties
10121 # Same color scheme as above, comments when differing
10122         style.ihex.0=$(style.anjuta.normal)
10123 # Record start ':'
10124         style.ihex.1=$(style.anjuta.attribute)
10126         style.ihex.2=$(style.anjuta.attribute)
10128         style.ihex.3=$(style.anjuta.attribute)
10130         style.ihex.4=$(style.anjuta.attribute)
10132         style.ihex.5=$(style.anjuta.attribute)
10134         style.ihex.6=$(style.anjuta.attribute)
10136         style.ihex.7=$(style.anjuta.attribute)
10137 # Data field: Start address
10138         style.ihex.9=$(style.anjuta.number)
10139 # Address field: Type unknown (4 digits as usual)
10140         style.ihex.10=$(style.anjuta.error)
10141 # Data field: Extended address
10142         style.ihex.11=$(style.anjuta.number)
10144         style.ihex.12=$(style.anjuta.number)
10146         style.ihex.13=$(style.anjuta.number)
10147 # Data field: Type unknown
10148         style.ihex.14=$(style.anjuta.char)
10150         style.ihex.15=$(style.anjuta.char)
10152         style.ihex.16=$(style.anjuta.char)
10154         style.ihex.17=$(style.anjuta.char)
10156         style.ihex.18=$(style.anjuta.char)
10160 ###############################################################################
10161 # Style for inno from file inno.properties
10163 # Comment
10164         style.inno.1=$(style.anjuta.comment)
10165 # Keyword
10166         style.inno.2=$(style.anjuta.keyword)
10167 # Parameter
10168         style.inno.3=$(style.anjuta.attribute)
10169 # Section
10170         style.inno.4=$(style.anjuta.function)
10171 # Preprocessor
10172         style.inno.5=$(style.anjuta.preprocessor)
10173 # Preprocessor (inline)
10174         style.inno.6=$(style.anjuta.preprocessor)
10175 # Pascal comment
10176         style.inno.7=$(style.anjuta.comment)
10177 # Pascal keyword
10178         style.inno.8=$(style.anjuta.keyword)
10179 # User defined keyword
10180         style.inno.9=$(style.anjuta.localkeyword)
10181 # Double quoted string
10182         style.inno.10=$(style.anjuta.string)
10183 # Single quoted string
10184         style.inno.11=$(style.anjuta.char)
10185 # Identifier - lexer internal. It is an error if any text is in this style.
10186         style.inno.12=$(style.anjuta.error)
10190 ###############################################################################
10191 # Style for json from file json.properties
10193 # Default
10194         style.json.0=$(style.anjuta.normal)
10195 # Number
10196         style.json.1=$(style.anjuta.number)
10197 # String
10198         style.json.2=$(style.anjuta.string)
10199 # Unclosed string
10200         style.json.3=$(style.anjuta.error)
10201 # Property name
10202         style.json.4=$(style.anjuta.attribute)
10203 # Escape sequence
10204         style.json.5=$(style.anjuta.string)
10205 # Line comment
10206         style.json.6=$(style.anjuta.comment)
10207 # Block comment
10208         style.json.7=$(style.anjuta.comment)
10209 # Operator
10210         style.json.8=$(style.anjuta.operator)
10211 # URL/IRI
10212         style.json.9=$(style.anjuta.syskeyword)
10213 # JSON-LD compact IRI
10214         style.json.10=$(style.anjuta.keyword)
10215 # JSON keyword
10216         style.json.11=$(style.anjuta.keyword)
10217 # JSON-LD keyword
10218         style.json.12=$(style.anjuta.keyword)
10219 # Parsing error
10220         style.json.13=$(style.anjuta.error)
10224 ###############################################################################
10225 # Style for kix from file kix.properties
10227 # White space
10228         style.kix.0=$(style.anjuta.whitespace)
10229 # Comment
10230         style.kix.1=$(style.anjuta.comment)
10231 # String
10232         style.kix.2=$(style.anjuta.string)
10234         style.kix.3=$(style.anjuta.char)
10235 # Number
10236         style.kix.4=$(style.anjuta.number)
10237 # Variables
10238         style.kix.5=$(style.anjuta.identifier)
10239 # Macro
10240         style.kix.6=$(style.anjuta.preprocessor)
10241 # Keyword
10242         style.kix.7=$(style.anjuta.keyword)
10243 # Function
10244         style.kix.8=$(style.anjuta.function)
10245 # Operator
10246         style.kix.9=$(style.anjuta.operator)
10247 # Stream comment
10248         style.kix.10=$(style.anjuta.comment)
10252 ###############################################################################
10253 # Style for latex from file latex.properties
10255 # White space
10256         style.latex.0=$(style.anjuta.whitespace)
10257 # Command
10258         style.latex.1=$(style.anjuta.keyword)
10259 # Tag Opening
10260         style.latex.2=$(style.anjuta.attribute)
10261 # Math Inline
10262         style.latex.3=$(style.anjuta.function)
10263 # Comment
10264         style.latex.4=$(style.anjuta.comment)
10265 # Tag Closing
10266         style.latex.5=$(style.anjuta.string)
10267 # Math Block
10268         style.latex.6=$(style.anjuta.regex)
10269 # Comment Block
10270         style.latex.7=$(style.anjuta.comment)
10271 # Verbatim Segment
10272         style.latex.8=$(style.anjuta.raw)
10273 # Short Command
10274         style.latex.9=$(style.anjuta.preprocessor)
10275 # Special Char
10276         style.latex.10=$(style.anjuta.char)
10277 # Command optional argument
10278         style.latex.11=$(style.anjuta.extrakeyword)
10279 # Syntax error
10280         style.latex.12=$(style.anjuta.error)
10284 ###############################################################################
10285 # Style for lisp from file lisp.properties
10287 # White space
10288         style.lisp.0=$(style.anjuta.whitespace)
10289 # Line Comment
10290         style.lisp.1=$(style.anjuta.comment)
10291 # Number
10292         style.lisp.2=$(style.anjuta.number)
10293 # Keyword
10294         style.lisp.3=$(style.anjuta.keyword)
10295 # Keyword 2
10296         style.lisp.4=$(style.anjuta.syskeyword)
10297 # Symbol
10298         style.lisp.5=$(style.anjuta.localkeyword)
10299 # String
10300         style.lisp.6=$(style.anjuta.string)
10301 # End of line where string is not closed
10302         style.lisp.8=$(style.anjuta.unclosed)
10303 # Operators
10304         style.lisp.10=$(style.anjuta.operator)
10305 # Special
10306         style.lisp.11=$(style.anjuta.extrakeyword)
10307 # Multi-line comment
10308         style.lisp.12=$(style.anjuta.comment)
10312 ###############################################################################
10313 # Style for lot from file lot.properties
10315 # Default
10316         style.lot.0=$(style.anjuta.normal)
10317 # header
10318         style.lot.1=$(style.anjuta.keyword)
10319 # break
10320         style.lot.2=$(style.anjuta.localkeyword)
10321 # set
10322         style.lot.3=$(style.anjuta.unclosed)
10323 # pass
10324         style.lot.4=$(style.anjuta.definition)
10325 # fail
10326         style.lot.5=$(style.anjuta.error)
10327 # abort
10328         style.lot.6=$(style.anjuta.error)
10332 ###############################################################################
10333 # Style for lout from file lout.properties
10335 # White space
10336         style.lout.0=$(style.anjuta.whitespace)
10337 # Comment
10338         style.lout.1=$(style.anjuta.comment)
10339 # Number
10340         style.lout.2=$(style.anjuta.number)
10341 # Keyword (@-prefixed keywords)
10342         style.lout.3=$(style.anjuta.keyword)
10343 # Keyword2 (symbol keywords)
10344         style.lout.4=$(style.anjuta.localkeyword)
10345 # Keyword3 (non-@ keywords)
10346         style.lout.5=$(style.anjuta.syskeyword)
10347 # Keyword4 (user or library symbols)
10348         style.lout.6=$(style.anjuta.extrakeyword)
10349 # Double quoted string
10350         style.lout.7=$(style.anjuta.string)
10351 # Operators
10352         style.lout.8=$(style.anjuta.operator)
10353 # End of line where string is not closed
10354         style.lout.10=$(style.anjuta.unclosed)
10358 ###############################################################################
10359 # Style for lua from file lua.properties
10361 # White space: Visible only in View Whitespace mode (or if it has a back colour)
10362         style.lua.0=$(style.anjuta.whitespace)
10363 # Block comment (Lua 5.0)
10364         style.lua.1=$(style.anjuta.comment)
10365 # Line comment
10366         style.lua.2=$(style.anjuta.comment)
10367 # Doc comment -- Not used in Lua (yet?)
10368         style.lua.3=$(style.anjuta.comment)
10369 # Number
10370         style.lua.4=$(style.anjuta.number)
10371 # Keyword
10372         style.lua.5=$(style.anjuta.keyword)
10373 # (Double quoted) String
10374         style.lua.6=$(style.anjuta.string)
10375 # Character (Single quoted string)
10376         style.lua.7=$(style.anjuta.char)
10377 # Literal string
10378         style.lua.8=$(style.anjuta.raw)
10379 # Preprocessor (obsolete in Lua 4.0 and up)
10380         style.lua.9=$(style.anjuta.preprocessor)
10381 # Operators
10382         style.lua.10=$(style.anjuta.operator)
10383 # End of line where string is not closed
10384         style.lua.12=$(style.anjuta.unclosed)
10385 # Other keywords (bozo test colors, but toned down ;)
10386         style.lua.13=$(style.anjuta.localkeyword)
10388         style.lua.14=$(style.anjuta.syskeyword)
10390         style.lua.15=$(style.anjuta.extrakeyword)
10392         style.lua.16=$(style.anjuta.keyword)
10394         style.lua.17=$(style.anjuta.localkeyword)
10396         style.lua.18=$(style.anjuta.syskeyword)
10398         style.lua.19=$(style.anjuta.extrakeyword)
10399 # Labels
10400         style.lua.20=$(style.anjuta.extrakeyword)
10404 ###############################################################################
10405 # Style for makefile from file others.properties
10407 # Default
10408         style.makefile.0=$(style.anjuta.normal)
10409 # Comment: #
10410         style.makefile.1=$(style.anjuta.comment)
10411 # Pre-processor or other comment: !
10412         style.makefile.2=$(style.anjuta.preprocessor)
10413 # Variable: $(x)
10414         style.makefile.3=$(style.anjuta.identifier)
10415 # Operator
10416         style.makefile.4=$(style.anjuta.operator)
10417 # Target
10418         style.makefile.5=$(style.anjuta.keyword)
10419 # Error
10420         style.makefile.9=$(style.anjuta.error)
10424 ###############################################################################
10425 # Style for matlab from file matlab.properties
10427 # White space
10428         style.matlab.0=$(style.anjuta.whitespace)
10429 # Comment
10430         style.matlab.1=$(style.anjuta.comment)
10431 # Command
10432         style.matlab.2=$(style.anjuta.function)
10433 # Number
10434         style.matlab.3=$(style.anjuta.number)
10435 # Keyword
10436         style.matlab.4=$(style.anjuta.keyword)
10437 # String (5=single quoted, 8=double quoted)
10438         style.matlab.5=$(style.anjuta.char)
10439 # Operator
10440         style.matlab.6=$(style.anjuta.operator)
10442         style.matlab.8=$(style.anjuta.string)
10446 ###############################################################################
10447 # Style for metapost from file metapost.properties
10449 # Default
10450         style.metapost.0=$(style.anjuta.whitespace)
10451 # Special
10452         style.metapost.1=$(style.anjuta.extrakeyword)
10453 # Group
10454         style.metapost.2=$(style.anjuta.function)
10455 # Symbol
10456         style.metapost.3=$(style.anjuta.operator)
10457 # Command
10458         style.metapost.4=$(style.anjuta.keyword)
10459 # Text
10460         style.metapost.5=$(style.anjuta.string)
10461 # Extra
10462         style.metapost.6=$(style.anjuta.extrakeyword)
10466 ###############################################################################
10467 # Style for mmixal from file mmixal.properties
10469 # Comment
10470         style.mmixal.1=$(style.anjuta.comment)
10471 # Label
10472         style.mmixal.2=$(style.anjuta.function)
10473 # Valid Opcode (as defined in opcodes above)
10474         style.mmixal.5=$(style.anjuta.localkeyword)
10475 # Unknown Opcode
10476         style.mmixal.6=$(style.anjuta.syskeyword)
10477 # Number
10478         style.mmixal.9=$(style.anjuta.number)
10479 # Reference (to a Label)
10480         style.mmixal.10=$(style.anjuta.function)
10481 # Char
10482         style.mmixal.11=$(style.anjuta.char)
10483 # String
10484         style.mmixal.12=$(style.anjuta.string)
10485 # Register (also special_register as defined above)
10486         style.mmixal.13=$(style.anjuta.identifier)
10487 # Hexadecimal Number
10488         style.mmixal.14=$(style.anjuta.number)
10489 # Operator
10490         style.mmixal.15=$(style.anjuta.operator)
10491 # Symbol (as defined in predef_symbols above)
10492         style.mmixal.16=$(style.anjuta.attribute)
10493 #~ style.mmixal.17=$(colour.preproc)
10494         style.mmixal.17=$(style.anjuta.preprocessor)
10498 ###############################################################################
10499 # Style for modula from file modula3.properties
10502         style.modula.0=$(style.anjuta.normal)
10504         style.modula.1=$(style.anjuta.comment)
10506         style.modula.2=$(style.anjuta.comment)
10508         style.modula.3=$(style.anjuta.comment)
10510         style.modula.4=$(style.anjuta.keyword)
10512         style.modula.5=$(style.anjuta.localkeyword)
10514         style.modula.6=$(style.anjuta.number)
10516         style.modula.7=$(style.anjuta.number)
10518         style.modula.8=$(style.anjuta.number)
10520         style.modula.9=$(style.anjuta.string)
10522         style.modula.10=$(style.anjuta.string)
10524         style.modula.11=$(style.anjuta.char)
10526         style.modula.12=$(style.anjuta.char)
10528         style.modula.13=$(style.anjuta.definition)
10530         style.modula.14=$(style.anjuta.preprocessor)
10532         style.modula.15=$(style.anjuta.preprocessor)
10534         style.modula.16=$(style.anjuta.operator)
10536         style.modula.17=$(style.anjuta.unclosed)
10540 ###############################################################################
10541 # Style for nimrod from file nimrod.properties
10543 # White space
10544         style.nimrod.0=$(style.anjuta.whitespace)
10545 # Comment
10546         style.nimrod.1=$(style.anjuta.comment)
10547 # Number
10548         style.nimrod.2=$(style.anjuta.number)
10549 # String
10550         style.nimrod.3=$(style.anjuta.string)
10551 # Single quoted string
10552         style.nimrod.4=$(style.anjuta.char)
10553 # Keyword
10554         style.nimrod.5=$(style.anjuta.keyword)
10555 # Triple quotes
10556         style.nimrod.6=$(style.anjuta.regex)
10557 # Triple double quotes
10558         style.nimrod.7=$(style.anjuta.string)
10559 # Class name definition
10560         style.nimrod.8=$(style.anjuta.definition)
10561 # Function or method name definition
10562         style.nimrod.9=$(style.anjuta.function)
10563 # Operators
10564         style.nimrod.10=$(style.anjuta.operator)
10565 # Comment-blocks
10566         style.nimrod.12=$(style.anjuta.comment)
10567 # End of line where string is not closed
10568         style.nimrod.13=$(style.anjuta.error)
10569 # Highlighted identifiers
10570         style.nimrod.14=$(style.anjuta.identifier)
10571 # Decorators
10572         style.nimrod.15=$(style.anjuta.attribute)
10576 ###############################################################################
10577 # Style for nncrontab from file nncrontab.properties
10579 # Comment (SCE_NNCRONTAB_COMMENT)
10580         style.nncrontab.1=$(style.anjuta.comment)
10581 # Task start/end (SCE_NNCRONTAB_TASK)
10582         style.nncrontab.2=$(style.anjuta.definition)
10583 # Section keywords (SCE_NNCRONTAB_SECTION)
10584         style.nncrontab.3=$(style.anjuta.function)
10585 # Keywords (SCE_NNCRONTAB_KEYWORD)
10586         style.nncrontab.4=$(style.anjuta.keyword)
10587 # Modificators (SCE_NNCRONTAB_MODIFIER)
10588         style.nncrontab.5=$(style.anjuta.attribute)
10589 # Asterisk (SCE_NNCRONTAB_ASTERISK)
10590         style.nncrontab.6=$(style.anjuta.operator)
10591 # Number (SCE_NNCRONTAB_NUMBER)
10592         style.nncrontab.7=$(style.anjuta.number)
10593 # Double quoted string (SCE_NNCRONTAB_STRING)
10594         style.nncrontab.8=$(style.anjuta.string)
10595 # Environment variable (SCE_NNCRONTAB_ENVIRONMENT)
10596         style.nncrontab.9=$(style.anjuta.identifier)
10597 # Identifier (SCE_NNCRONTAB_IDENTIFIER) - lexer internal. It is an error if any text is in this style.
10598         style.nncrontab.10=$(style.anjuta.error)
10602 ###############################################################################
10603 # Style for nsis from file nsis.properties
10605 # Whitespace (SCE_NSIS_DEFAULT)
10606         style.nsis.0=$(style.anjuta.whitespace)
10607 # Comment (SCE_NSIS_COMMENT)
10608         style.nsis.1=$(style.anjuta.comment)
10609 # String double quote (SCE_NSIS_STRINGDQ)
10610         style.nsis.2=$(style.anjuta.string)
10611 # String left quote (SCE_NSIS_STRINGLQ)
10612         style.nsis.3=$(style.anjuta.char)
10613 # String right quote (SCE_NSIS_STRINGRQ)
10614         style.nsis.4=$(style.anjuta.char)
10615 # Function (SCE_NSIS_FUNCTION)
10616         style.nsis.5=$(style.anjuta.function)
10617 # Variable (SCE_NSIS_VARIABLE)
10618         style.nsis.6=$(style.anjuta.identifier)
10619 # Label (SCE_NSIS_LABEL)
10620         style.nsis.7=$(style.anjuta.function)
10621 # User Defined (SCE_NSIS_USERDEFINED)
10622         style.nsis.8=$(style.anjuta.extrakeyword)
10623 # Section (SCE_NSIS_SECTIONDEF)
10624         style.nsis.9=$(style.anjuta.preprocessor)
10625 # Sub section (SCE_NSIS_SUBSECTIONDEF)
10626         style.nsis.10=$(style.anjuta.preprocessor)
10627 # If def (SCE_NSIS_IFDEFINEDEF)
10628         style.nsis.11=$(style.anjuta.preprocessor)
10629 # Macro def (SCE_NSIS_MACRODEF)
10630         style.nsis.12=$(style.anjuta.preprocessor)
10631 # Variable within string (SCE_NSIS_STRINGVAR)
10632         style.nsis.13=$(style.anjuta.identifier)
10633 # Numbers (SCE_NSIS_NUMBER)
10634         style.nsis.14=$(style.anjuta.number)
10635 # Section Group SCE_NSIS_SECTIONGROUP)
10636         style.nsis.15=$(style.anjuta.preprocessor)
10637 # Page Ex SCE_NSIS_PAGEEX)
10638         style.nsis.16=$(style.anjuta.preprocessor)
10639 # Function Definition SCE_NSIS_FUNCTIONDEF)
10640         style.nsis.17=$(style.anjuta.preprocessor)
10641 # Comment Box SCE_NSIS_COMMENTBOX)
10642         style.nsis.18=$(style.anjuta.comment)
10646 ###############################################################################
10647 # Style for octave from file matlab.properties
10649 # White space
10650         style.octave.0=$(style.anjuta.whitespace)
10651 # Comment
10652         style.octave.1=$(style.anjuta.comment)
10653 # Command
10654         style.octave.2=$(style.anjuta.function)
10655 # Number
10656         style.octave.3=$(style.anjuta.number)
10657 # Keyword
10658         style.octave.4=$(style.anjuta.keyword)
10659 # String (5: single quoted, 8: double quoted)
10660         style.octave.5=$(style.anjuta.char)
10661 # Operator
10662         style.octave.6=$(style.anjuta.operator)
10664         style.octave.8=$(style.anjuta.string)
10668 ###############################################################################
10669 # Style for opal from file opal.properties
10671 # White space
10672         style.opal.0=$(style.anjuta.whitespace)
10673 # Comment block
10674         style.opal.1=$(style.anjuta.comment)
10675 # Comment line
10676         style.opal.2=$(style.anjuta.comment)
10677 # Integer
10678         style.opal.3=$(style.anjuta.number)
10679 # Keyword
10680         style.opal.4=$(style.anjuta.keyword)
10681 # Sort
10682         style.opal.5=$(style.anjuta.char)
10683 # Double quoted string
10684         style.opal.6=$(style.anjuta.string)
10685 # Brace normal
10686         style.opal.7=$(style.anjuta.operator)
10687 # Bool const
10688         style.opal.8=$(style.anjuta.identifier)
10692 ###############################################################################
10693 # Style for oscript from file oscript.properties
10695 # Single-line comment.
10696         style.oscript.1=$(style.anjuta.comment)
10697 # Multi-line comment.
10698         style.oscript.2=$(style.anjuta.comment)
10699 # #ifdef DOC and #endif; the value of DOC is supposed to be never defined.
10700         style.oscript.3=$(style.anjuta.comment)
10701 # Preprocessor directive.
10702         style.oscript.4=$(style.anjuta.preprocessor)
10703 # Number.
10704         style.oscript.5=$(style.anjuta.number)
10705 # String enclosed in single quotes (apostrophes).
10706         style.oscript.6=$(style.anjuta.char)
10707 # String enclosed in double quotes (quotation marks).
10708         style.oscript.7=$(style.anjuta.string)
10709 # Constant literal. See the property keywords2 above.
10710         style.oscript.8=$(style.anjuta.localkeyword)
10711 # Server-global variable (prefixed by $).
10712         style.oscript.10=$(style.anjuta.definition)
10713 # Language native keyword or reserved word. See the property keywords above.
10714         style.oscript.11=$(style.anjuta.keyword)
10715 # Operator; either symbolic or literal. See the property keywords3 above.
10716         style.oscript.12=$(style.anjuta.operator)
10717 # Label to jump to with the GoTo statement.
10718         style.oscript.13=$(style.anjuta.identifier)
10719 # See the property keywords4 above.
10720         style.oscript.14=$(style.anjuta.syskeyword)
10721 # See the property keywords5 above.
10722         style.oscript.15=$(style.anjuta.extrakeyword)
10723 # Static built-in object. See the property keywords6 above.
10724         style.oscript.16=$(style.anjuta.function)
10728 ###############################################################################
10729 # Style for pascal from file pascal.properties
10731 # White space
10732         style.pascal.0=$(style.anjuta.whitespace)
10733 # Comment: { ... }
10734         style.pascal.2=$(style.anjuta.comment)
10735 # Comment: (* ... *)
10736         style.pascal.3=$(style.anjuta.comment)
10737 # Line Comment: // ...
10738         style.pascal.4=$(style.anjuta.number)
10739 # Preprocessor: {$ ... }
10740         style.pascal.5=$(style.anjuta.keyword)
10741 # Preprocessor: (*$ ... *)
10742         style.pascal.6=$(style.anjuta.string)
10743 # Number
10744         style.pascal.7=$(style.anjuta.char)
10745 # Hex Number
10746         style.pascal.8=$(style.anjuta.operator)
10747 # Keyword
10748         style.pascal.9=$(style.anjuta.preprocessor)
10749 # String
10750         style.pascal.10=$(style.anjuta.operator)
10751 # End of line where string is not closed
10752         style.pascal.11=$(style.anjuta.error)
10753 # Character
10754         style.pascal.12=$(style.anjuta.char)
10755 # Operators
10756         style.pascal.13=$(style.anjuta.operator)
10757 # Inline Asm
10758         style.pascal.14=$(style.anjuta.localkeyword)
10762 ###############################################################################
10763 # Style for perl from file perl.properties
10765 # White space
10766         style.perl.0=$(style.anjuta.whitespace)
10767 # Error
10768         style.perl.1=$(style.anjuta.comment)
10769 # Comment
10770         style.perl.2=$(style.anjuta.comment)
10771 # POD: = at beginning of line
10772         style.perl.3=$(style.anjuta.comment)
10773 # Number
10774         style.perl.4=$(style.anjuta.number)
10775 # Keyword
10776         style.perl.5=$(style.anjuta.keyword)
10777 # Double quoted string
10778         style.perl.6=$(style.anjuta.string)
10779 # Single quoted string
10780         style.perl.7=$(style.anjuta.char)
10781 # Symbols / Punctuation. Currently not used by LexPerl.
10782         style.perl.8=$(style.anjuta.operator)
10783 # Preprocessor. Currently not used by LexPerl.
10784         style.perl.9=$(style.anjuta.preprocessor)
10785 # Operators
10786         style.perl.10=$(style.anjuta.operator)
10787 # Identifiers (functions, etc.)
10788         style.perl.11=$(style.anjuta.identifier)
10789 # Scalars: $var
10790         style.perl.12=$(style.anjuta.identifier)
10791 # Array: @var
10792         style.perl.13=$(style.anjuta.identifier)
10793 # Hash: %var
10794         style.perl.14=$(style.anjuta.identifier)
10795 # Symbol table: *var
10796         style.perl.15=$(style.anjuta.identifier)
10797 # SCE_PL_VARIABLE_INDEXER allocated but unused
10798         style.perl.16=$(style.anjuta.error)
10799 # Regex: /re/ or m{re}
10800         style.perl.17=$(style.anjuta.regex)
10801 # Substitution: s/re/ore/
10802         style.perl.18=$(style.anjuta.regex)
10803 # Long Quote (qq, qr, qw, qx) -- obsolete: replaced by qq, qx, qr, qw
10804         style.perl.19=$(style.anjuta.string)
10805 # Back Ticks
10806         style.perl.20=$(style.anjuta.char)
10807 # Data Section: __DATA__ or __END__ at beginning of line
10808         style.perl.21=$(style.anjuta.function)
10809 # Here-doc (delimiter)
10810         style.perl.22=$(style.anjuta.comment)
10811 # Here-doc (single quoted, q)
10812         style.perl.23=$(style.anjuta.comment)
10813 # Here-doc (double quoted, qq)
10814         style.perl.24=$(style.anjuta.comment)
10815 # Here-doc (back ticks, qx)
10816         style.perl.25=$(style.anjuta.comment)
10817 # Single quoted string, generic
10818         style.perl.26=$(style.anjuta.char)
10819 # qq = Double quoted string
10820         style.perl.27=$(style.anjuta.string)
10821 # qx = Back ticks
10822         style.perl.28=$(style.anjuta.char)
10823 # qr = Regex
10824         style.perl.29=$(style.anjuta.regex)
10825 # qw = Array
10826         style.perl.30=$(style.anjuta.identifier)
10827 # POD: verbatim paragraphs
10828         style.perl.31=$(style.anjuta.comment)
10829 # subroutine prototype
10830         style.perl.40=$(style.anjuta.attribute)
10831 # format identifier
10832         style.perl.41=$(style.anjuta.raw)
10833 # format body
10834         style.perl.42=$(style.anjuta.raw)
10835 # Double quoted string (interpolated variable)
10836         style.perl.43=$(style.anjuta.string)
10837 # translation: tr{}{} y{}{}
10838         style.perl.44=$(style.anjuta.regex)
10839 # Regex: /re/ or m{re} (interpolated variable)
10840         style.perl.54=$(style.anjuta.regex)
10841 # Substitution: s/re/ore/ (interpolated variable)
10842         style.perl.55=$(style.anjuta.regex)
10843 # Back Ticks (interpolated variable)
10844         style.perl.57=$(style.anjuta.char)
10845 # Here-doc (double quoted, qq) (interpolated variable)
10846         style.perl.61=$(style.anjuta.comment)
10847 # Here-doc (back ticks, qx) (interpolated variable)
10848         style.perl.62=$(style.anjuta.comment)
10849 # qq = Double quoted string (interpolated variable)
10850         style.perl.64=$(style.anjuta.string)
10851 # qx = Back ticks (interpolated variable)
10852         style.perl.65=$(style.anjuta.char)
10853 # qr = Regex (interpolated variable)
10854         style.perl.66=$(style.anjuta.regex)
10858 ###############################################################################
10859 # Style for pov from file pov.properties
10861 # White space: Visible only in View Whitespace mode (or if it has a back colour)
10862         style.pov.0=$(style.anjuta.whitespace)
10863 # Comment: /* */. Use fixed font to keep boxed comments as boxes
10864         style.pov.1=$(style.anjuta.comment)
10865 # Line Comment: //. Proportionnal font is generally OK here
10866         style.pov.2=$(style.anjuta.comment)
10867 # Number
10868         style.pov.3=$(style.anjuta.number)
10869 # Operators
10870         style.pov.4=$(style.anjuta.operator)
10871 # Double quoted string
10872         style.pov.6=$(style.anjuta.string)
10873 # End of line where string is not closed
10874         style.pov.7=$(style.anjuta.unclosed)
10875 # Directive: #keyword
10876         style.pov.8=$(style.anjuta.preprocessor)
10877 # Directive keyword error
10878         style.pov.9=$(style.anjuta.error)
10879 # Keyword 2: Objects & CSG & Appearance (xxx {})
10880         style.pov.10=$(style.anjuta.keyword)
10881 # Keyword 3: Types & Modifiers & Items
10882         style.pov.11=$(style.anjuta.attribute)
10883 # Keyword 4: Predefined Identifiers
10884         style.pov.12=$(style.anjuta.identifier)
10885 # Keyword 5: Predefined Functions
10886         style.pov.13=$(style.anjuta.function)
10887 # Keyword 6
10888         style.pov.14=$(style.anjuta.localkeyword)
10889 # Keyword 7
10890         style.pov.15=$(style.anjuta.syskeyword)
10891 # Keyword 8
10892         style.pov.16=$(style.anjuta.extrakeyword)
10896 ###############################################################################
10897 # Style for powerpro from file powerpro.properties
10899 # Default text color
10900         style.powerpro.0=$(style.anjuta.normal)
10901 # Comment: /* */
10902         style.powerpro.1=$(style.anjuta.comment)
10903 # Line Comment: // ;; ;
10904         style.powerpro.2=$(style.anjuta.comment)
10905 # Number
10906         style.powerpro.3=$(style.anjuta.number)
10907 # Keywords1
10908         style.powerpro.4=$(style.anjuta.keyword)
10909 # Keywords2
10910         style.powerpro.5=$(style.anjuta.localkeyword)
10911 # Keywords3
10912         style.powerpro.6=$(style.anjuta.syskeyword)
10913 # Keywords4
10914         style.powerpro.7=$(style.anjuta.extrakeyword)
10915 # Double quoted string
10916         style.powerpro.8=$(style.anjuta.string)
10917 # Single quoted string
10918         style.powerpro.9=$(style.anjuta.char)
10919 # Line continuation
10920         style.powerpro.10=$(style.anjuta.preprocessor)
10921 # Operators
10922         style.powerpro.11=$(style.anjuta.operator)
10923 # Identifiers
10924         style.powerpro.12=$(style.anjuta.identifier)
10925 # End of line where string is not closed
10926         style.powerpro.13=$(style.anjuta.error)
10927 # Verbatim strings
10928         style.powerpro.14=$(style.anjuta.regex)
10929 #alternate quote style (#)
10930         style.powerpro.15=$(style.anjuta.string)
10931 #function style
10932         style.powerpro.16=$(style.anjuta.function)
10936 ###############################################################################
10937 # Style for powershell from file powershell.properties
10939 # Default
10940         style.powershell.0=$(style.anjuta.whitespace)
10941 # Comment
10942         style.powershell.1=$(style.anjuta.comment)
10943 # String
10944         style.powershell.2=$(style.anjuta.string)
10945 # Character
10946         style.powershell.3=$(style.anjuta.char)
10947 # Number
10948         style.powershell.4=$(style.anjuta.number)
10949 # Variable
10950         style.powershell.5=$(style.anjuta.identifier)
10951 # Operator
10952         style.powershell.6=$(style.anjuta.operator)
10953 # Identifier
10954         style.powershell.7=$(style.anjuta.identifier)
10955 # Keyword
10956         style.powershell.8=$(style.anjuta.keyword)
10957 # Cmdlet
10958         style.powershell.9=$(style.anjuta.localkeyword)
10959 # Alias
10960         style.powershell.10=$(style.anjuta.attribute)
10961 # Function
10962         style.powershell.11=$(style.anjuta.function)
10963 # Comment (multi-line)
10964         style.powershell.13=$(style.anjuta.comment)
10965 # Here-string
10966         style.powershell.14=$(style.anjuta.string)
10967 # Here-string single quote
10968         style.powershell.15=$(style.anjuta.char)
10969 # Comment keyword
10970         style.powershell.16=$(style.anjuta.comment)
10974 ###############################################################################
10975 # Style for props from file others.properties
10977 # Comment
10978         style.props.1=$(style.anjuta.comment)
10979 # Section
10980         style.props.2=$(style.anjuta.function)
10981 # Assignment operator
10982         style.props.3=$(style.anjuta.operator)
10983 # Default value (@)
10984         style.props.4=$(style.anjuta.attribute)
10988 ###############################################################################
10989 # Style for ps from file ps.properties
10991 #Default
10992         style.ps.0=$(style.anjuta.normal)
10993 # Comment
10994         style.ps.1=$(style.anjuta.comment)
10995 # DSC comment
10996         style.ps.2=$(style.anjuta.comment)
10997 # DSC comment value
10998         style.ps.3=$(style.anjuta.comment)
10999 # Number
11000         style.ps.4=$(style.anjuta.number)
11001 # Name
11002         style.ps.5=$(style.anjuta.identifier)
11003 # Keyword
11004         style.ps.6=$(style.anjuta.keyword)
11005 # Literal
11006         style.ps.7=$(style.anjuta.string)
11007 # Immediately evaluated literal
11008         style.ps.8=$(style.anjuta.char)
11009 # Array parenthesis
11010         style.ps.9=$(style.anjuta.operator)
11011 # Dictionary parenthesis
11012         style.ps.10=$(style.anjuta.operator)
11013 # Procedure parenthesis
11014         style.ps.11=$(style.anjuta.operator)
11015 # Text
11016         style.ps.12=$(style.anjuta.raw)
11017 # Hex string
11018         style.ps.13=$(style.anjuta.number)
11019 # Base85 string
11020         style.ps.14=$(style.anjuta.regex)
11021 # Bad string character
11022         style.ps.15=$(style.anjuta.error)
11026 ###############################################################################
11027 # Style for purebasic from file purebasic.properties
11029 # Default
11030         style.purebasic.0=$(style.anjuta.normal)
11031 # Comment
11032         style.purebasic.1=$(style.anjuta.comment)
11033 # Number
11034         style.purebasic.2=$(style.anjuta.number)
11035 # Keyword1
11036         style.purebasic.3=$(style.anjuta.keyword)
11037 # String
11038         style.purebasic.4=$(style.anjuta.string)
11039 # Operator
11040         style.purebasic.6=$(style.anjuta.operator)
11041 # Identifier
11042         style.purebasic.7=$(style.anjuta.identifier)
11043 # Keyword2
11044         style.purebasic.10=$(style.anjuta.preprocessor)
11045 # Keyword3
11046         style.purebasic.11=$(style.anjuta.localkeyword)
11047 # Keyword4
11048         style.purebasic.12=$(style.anjuta.syskeyword)
11049 # Constant
11050         style.purebasic.13=$(style.anjuta.number)
11051 # Label
11052         style.purebasic.15=$(style.anjuta.definition)
11053 # Error
11054         style.purebasic.16=$(style.anjuta.error)
11055 # HexNumber
11056         style.purebasic.17=$(style.anjuta.number)
11057 # BinNumber
11058         style.purebasic.18=$(style.anjuta.number)
11062 ###############################################################################
11063 # Style for python from file python.properties
11065 # White space
11066         style.python.0=$(style.anjuta.whitespace)
11067 # Comment
11068         style.python.1=$(style.anjuta.comment)
11069 # Number
11070         style.python.2=$(style.anjuta.number)
11071 # String
11072         style.python.3=$(style.anjuta.string)
11073 # Single quoted string
11074         style.python.4=$(style.anjuta.char)
11075 # Keyword
11076         style.python.5=$(style.anjuta.keyword)
11077 # Triple quotes
11078         style.python.6=$(style.anjuta.string)
11079 # Triple double quotes
11080         style.python.7=$(style.anjuta.string)
11081 # Class name definition
11082         style.python.8=$(style.anjuta.definition)
11083 # Function or method name definition
11084         style.python.9=$(style.anjuta.function)
11085 # Operators
11086         style.python.10=$(style.anjuta.operator)
11087 # Comment-blocks
11088         style.python.12=$(style.anjuta.comment)
11089 # End of line where string is not closed
11090         style.python.13=$(style.anjuta.unclosed)
11091 # Highlighted identifiers
11092         style.python.14=$(style.anjuta.identifier)
11093 # Decorators
11094         style.python.15=$(style.anjuta.attribute)
11095 # F-String
11096         style.python.16=$(style.anjuta.string)
11097 # Single quoted f-string
11098         style.python.17=$(style.anjuta.char)
11099 # Triple quoted f-string
11100         style.python.18=$(style.anjuta.string)
11101 # Triple double quoted f-string
11102         style.python.19=$(style.anjuta.string)
11106 ###############################################################################
11107 # Style for r from file r.properties
11109 # White space
11110         style.r.0=$(style.anjuta.whitespace)
11111 # Comment
11112         style.r.1=$(style.anjuta.comment)
11113 #Keyword
11114         style.r.2=$(style.anjuta.keyword)
11115 # Base Package Function
11116         style.r.3=$(style.anjuta.localkeyword)
11117 # Other Package Function
11118         style.r.4=$(style.anjuta.syskeyword)
11119 # Number
11120         style.r.5=$(style.anjuta.number)
11121 # " Delimited String
11122         style.r.6=$(style.anjuta.string)
11123 # ' Delimited String
11124         style.r.7=$(style.anjuta.char)
11125 # Operator
11126         style.r.8=$(style.anjuta.operator)
11127 # Identifier
11128         style.r.9=$(style.anjuta.identifier)
11129 # INFIX highlight
11130         style.r.10=$(style.anjuta.extrakeyword)
11131 # INFIX End of Line error
11132         style.r.11=$(style.anjuta.error)
11136 ###############################################################################
11137 # Style for rebol from file rebol.properties
11139 # Any other text
11140         style.rebol.0=$(style.anjuta.normal)
11141 # Line Comment
11142         style.rebol.1=$(style.anjuta.comment)
11143 # Block Comment ( comment {the text} )
11144         style.rebol.2=$(style.anjuta.comment)
11145 # Preface (text before the REBOL header)
11146         style.rebol.3=$(style.anjuta.comment)
11147 # Operators
11148         style.rebol.4=$(style.anjuta.operator)
11149 # Characters ( #"a" )
11150         style.rebol.5=$(style.anjuta.string)
11151 # String with quotes
11152         style.rebol.6=$(style.anjuta.char)
11153 # String with braces
11154         style.rebol.7=$(style.anjuta.raw)
11155 # Number
11156         style.rebol.8=$(style.anjuta.number)
11157 # Pair ( 800x600 )
11158         style.rebol.9=$(style.anjuta.number)
11159 # Tuple ( 127.0.0.1 )
11160         style.rebol.10=$(style.anjuta.number)
11161 # Binary ( 16#{1A803F59} )
11162         style.rebol.11=$(style.anjuta.number)
11163 # Money
11164         style.rebol.12=$(style.anjuta.number)
11165 # Issue { #123-CD-456 }
11166         style.rebol.13=$(style.anjuta.definition)
11167 # Tag { <TITLE height=100> }
11168         style.rebol.14=$(style.anjuta.definition)
11169 # File { %/C/Winnt/some.dll }
11170         style.rebol.15=$(style.anjuta.attribute)
11171 # Email { joe@mail.dom }
11172         style.rebol.16=$(style.anjuta.attribute)
11173 # URL { ftp://there.dom }
11174         style.rebol.17=$(style.anjuta.attribute)
11175 # Date { 17-Feb-2004 1/3/99 }
11176         style.rebol.18=$(style.anjuta.number)
11177 # Time { 12:30 11:22:59 01:59:59.123 }
11178         style.rebol.19=$(style.anjuta.number)
11179 # Keyword (all)
11180         style.rebol.21=$(style.anjuta.keyword)
11181 # Keyword (test functions)
11182         style.rebol.22=$(style.anjuta.localkeyword)
11183 # Keyword (datatypes)
11184         style.rebol.23=$(style.anjuta.syskeyword)
11185 # Keyword 4
11186         style.rebol.24=$(style.anjuta.extrakeyword)
11187 # Keyword 5
11188         style.rebol.25=$(style.anjuta.extrakeyword)
11189 # Keyword 6
11190         style.rebol.26=$(style.anjuta.extrakeyword)
11191 # Keyword 7
11192         style.rebol.27=$(style.anjuta.extrakeyword)
11193 # Keyword 8
11194         style.rebol.28=$(style.anjuta.extrakeyword)
11198 ###############################################################################
11199 # Style for registry from file registry.properties
11201 # Default
11202         style.registry.0=$(style.anjuta.normal)
11203 # Comment: ;;
11204         style.registry.1=$(style.anjuta.comment)
11205 # Value name: "Icon"="cmd.exe,-1"
11206         style.registry.2=$(style.anjuta.number)
11207 # String
11208         style.registry.3=$(style.anjuta.string)
11209 # Hex digit
11210         style.registry.4=$(style.anjuta.regex)
11211 # Value type: dword, hex(2), hex(7)
11212         style.registry.5=$(style.anjuta.definition)
11213 # Added key, [HKLM\*\shell\notepad]
11214         style.registry.6=$(style.anjuta.keyword)
11215 # Removed key, [-HKLM\*\shell\notepad]
11216         style.registry.7=$(style.anjuta.syskeyword)
11217 # Escaped characters in strings
11218         style.registry.8=$(style.anjuta.string)
11219 # GUID in key path, [HKCU\{C4ACBD3E-6114-4618-904C-B206ABA9DEB0}]
11220         style.registry.9=$(style.anjuta.number)
11221 # GUID in string, @="{C4ACBD3E-6114-4618-904C-B206ABA9DEB0}"
11222         style.registry.10=$(style.anjuta.number)
11223 # Parameter: "notepad.exe %1 %*"
11224         style.registry.11=$(style.anjuta.attribute)
11225 # Operators
11226         style.registry.12=$(style.anjuta.operator)
11230 ###############################################################################
11231 # Style for ruby from file ruby.properties
11233 # White space
11234         style.ruby.0=$(style.anjuta.whitespace)
11235 # Error
11236         style.ruby.1=$(style.anjuta.error)
11237 # Comment line
11238         style.ruby.2=$(style.anjuta.comment)
11239 # POD
11240         style.ruby.3=$(style.anjuta.comment)
11241 # Number
11242         style.ruby.4=$(style.anjuta.number)
11243 # Word
11244         style.ruby.5=$(style.anjuta.keyword)
11245 # String
11246         style.ruby.6=$(style.anjuta.string)
11247 # Character
11248         style.ruby.7=$(style.anjuta.char)
11249 # Class name
11250         style.ruby.8=$(style.anjuta.localkeyword)
11251 # Def name
11252         style.ruby.9=$(style.anjuta.syskeyword)
11253 # Operator
11254         style.ruby.10=$(style.anjuta.operator)
11255 # Regex
11256         style.ruby.12=$(style.anjuta.regex)
11257 # Global
11258         style.ruby.13=$(style.anjuta.unclosed)
11259 # Symbol
11260         style.ruby.14=$(style.anjuta.operator)
11261 # MODULE_NAME
11262         style.ruby.15=$(style.anjuta.extrakeyword)
11263 # INSTANCE_VAR
11264         style.ruby.16=$(style.anjuta.identifier)
11265 # CLASS_VAR
11266         style.ruby.17=$(style.anjuta.identifier)
11267 # BACKTICKS
11268         style.ruby.18=$(style.anjuta.raw)
11269 # DATASECTION
11270         style.ruby.19=$(style.anjuta.function)
11271 # HERE_DELIM
11272         style.ruby.20=$(style.anjuta.raw)
11273 # HERE_Q
11274         style.ruby.21=$(style.anjuta.raw)
11275 # HERE_QQ
11276         style.ruby.22=$(style.anjuta.raw)
11277 # HERE_QX
11278         style.ruby.23=$(style.anjuta.raw)
11279 # STRING_Q
11280         style.ruby.24=$(style.anjuta.string)
11281 # STRING_QQ
11282         style.ruby.25=$(style.anjuta.string)
11283 # STRING_QX
11284         style.ruby.26=$(style.anjuta.string)
11285 # STRING_QR
11286         style.ruby.27=$(style.anjuta.string)
11287 # STRING_QW
11288         style.ruby.28=$(style.anjuta.string)
11289 # Demoted Keyword
11290         style.ruby.29=$(style.anjuta.keyword)
11291 # STDIN
11292         style.ruby.30=$(style.anjuta.definition)
11293 # STDOUT
11294         style.ruby.31=$(style.anjuta.definition)
11295 # STDERR
11296         style.ruby.40=$(style.anjuta.definition)
11297 # SCE_RB_UPPER_BOUND allocated but unused
11298         style.ruby.41=$(style.anjuta.error)
11302 ###############################################################################
11303 # Style for rust from file rust.properties
11305 # Whitespace
11306         style.rust.0=$(style.anjuta.whitespace)
11307 # Block comment
11308         style.rust.1=$(style.anjuta.comment)
11309 # Line comment
11310         style.rust.2=$(style.anjuta.comment)
11311 # Block doc comment
11312         style.rust.3=$(style.anjuta.comment)
11313 # Line doc comment
11314         style.rust.4=$(style.anjuta.comment)
11315 # Number
11316         style.rust.5=$(style.anjuta.number)
11317 # Keywords 1-7
11318         style.rust.6=$(style.anjuta.keyword)
11320         style.rust.7=$(style.anjuta.kewyord)
11322         style.rust.8=$(style.anjuta.syskeyword)
11324         style.rust.9=$(style.anjuta.localkeyword)
11326         style.rust.10=$(style.anjuta.localkeyword)
11328         style.rust.11=$(style.anjuta.localkeyword)
11330         style.rust.12=$(style.anjuta.localkeyword)
11331 # Regular string
11332         style.rust.13=$(style.anjuta.regex)
11333 # Raw string
11334         style.rust.14=$(style.anjuta.string)
11335 # Character
11336         style.rust.15=$(style.anjuta.char)
11337 # Operator
11338         style.rust.16=$(style.anjuta.operator)
11339 # Lifetime
11340         style.rust.18=$(style.anjuta.attribute)
11341 # Macro
11342         style.rust.19=$(style.anjuta.preprocessor)
11343 # Lexical error
11344         style.rust.20=$(style.anjuta.error)
11345 # Byte string
11346         style.rust.21=$(style.anjuta.string)
11347 # Raw byte string
11348         style.rust.22=$(style.anjuta.string)
11349 # Byte character
11350         style.rust.23=$(style.anjuta.char)
11354 ###############################################################################
11355 # Style for scriptol from file scriptol.properties
11357 # Default
11358         style.scriptol.0=$(style.anjuta.normal)
11359 # White space
11360         style.scriptol.1=$(style.anjuta.whitespace)
11361 # Scriptol style comment line
11362         style.scriptol.2=$(style.anjuta.comment)
11363 # Persistent comment line
11364         style.scriptol.3=$(style.anjuta.comment)
11365 # C style comment line
11366         style.scriptol.4=$(style.anjuta.comment)
11367 # Comment-blocks
11368         style.scriptol.5=$(style.anjuta.comment)
11369 # Number
11370         style.scriptol.6=$(style.anjuta.number)
11371 # String
11372         style.scriptol.7=$(style.anjuta.string)
11373 # Character/Single quoted string
11374         style.scriptol.8=$(style.anjuta.char)
11375 # End of line where string is not closed
11376         style.scriptol.9=$(style.anjuta.error)
11377 # Keyword
11378         style.scriptol.10=$(style.anjuta.keyword)
11379 # Operators
11380         style.scriptol.11=$(style.anjuta.operator)
11381 # Identifiers
11382         style.scriptol.12=$(style.anjuta.identifier)
11383 # Class name definition
11384         style.scriptol.14=$(style.anjuta.definition)
11388 ###############################################################################
11389 # Style for smalltalk from file smalltalk.properties
11391 # String
11392         style.smalltalk.1=$(style.anjuta.string)
11393 # Number
11394         style.smalltalk.2=$(style.anjuta.number)
11395 # Comment
11396         style.smalltalk.3=$(style.anjuta.comment)
11397 # Symbol
11398         style.smalltalk.4=$(style.anjuta.identifier)
11399 # Binary
11400         style.smalltalk.5=$(style.anjuta.number)
11401 # Boolean
11402         style.smalltalk.6=$(style.anjuta.keyword)
11403 # self
11404         style.smalltalk.7=$(style.anjuta.keyword)
11405 # super
11406         style.smalltalk.8=$(style.anjuta.keyword)
11407 # nil
11408         style.smalltalk.9=$(style.anjuta.keyword)
11409 # Global
11410         style.smalltalk.10=$(style.anjuta.definition)
11411 # Return
11412         style.smalltalk.11=$(style.anjuta.syskeyword)
11413 # Special
11414         style.smalltalk.12=$(style.anjuta.extrakeyword)
11415 # KwSend
11416         style.smalltalk.13=$(style.anjuta.keyword)
11417 # Assignment
11418         style.smalltalk.14=$(style.anjuta.operator)
11419 # Character
11420         style.smalltalk.15=$(style.anjuta.char)
11421 # Special selector
11422         style.smalltalk.16=$(style.anjuta.regex)
11426 ###############################################################################
11427 # Style for sorcins from file sorcins.properties
11429 # Command
11430         style.sorcins.1=$(style.anjuta.keyword)
11431 # Parameter
11432         style.sorcins.2=$(style.anjuta.attribute)
11433 # Comment line
11434         style.sorcins.3=$(style.anjuta.comment)
11435 # String
11436         style.sorcins.4=$(style.anjuta.string)
11437 # Constant
11438         style.sorcins.9=$(style.anjuta.number)
11442 ###############################################################################
11443 # Style for specman from file specman.properties
11445 # White space
11446         style.specman.0=$(style.anjuta.whitespace)
11447 # Code
11448         style.specman.1=$(style.anjuta.keyword)
11449 # Line Comment
11450         style.specman.2=$(style.anjuta.comment)
11451 # Line Bang Comment
11452         style.specman.3=$(style.anjuta.comment)
11453 # Number
11454         style.specman.4=$(style.anjuta.number)
11455 # Keyword
11456         style.specman.5=$(style.anjuta.keyword)
11457 # Double quoted string
11458         style.specman.6=$(style.anjuta.string)
11459 # Keyword 2
11460         style.specman.7=$(style.anjuta.extrakeyword)
11461 # Keyword 3
11462         style.specman.8=$(style.anjuta.syskeyword)
11463 # Preprocessor
11464         style.specman.9=$(style.anjuta.preprocessor)
11465 # Operators
11466         style.specman.10=$(style.anjuta.operator)
11467 # End of line where string is not closed
11468         style.specman.12=$(style.anjuta.error)
11469 # Regexp tag
11470         style.specman.13=$(style.anjuta.regex)
11471 # HDL Signal
11472         style.specman.14=$(style.anjuta.attribute)
11473 # User defined
11474         style.specman.19=$(style.anjuta.localkeyword)
11478 ###############################################################################
11479 # Style for spice from file spice.properties
11481 # Default
11482         style.spice.0=$(style.anjuta.whitespace)
11483 # Keyword
11484         style.spice.2=$(style.anjuta.keyword)
11485 # Keyword2
11486         style.spice.3=$(style.anjuta.localkeyword)
11487 # Keyword3
11488         style.spice.4=$(style.anjuta.syskeyword)
11489 # Number
11490         style.spice.5=$(style.anjuta.number)
11491 # Operators (delimiters)
11492         style.spice.6=$(style.anjuta.operator)
11493 # Value
11494         style.spice.7=$(style.anjuta.char)
11495 # Comment
11496         style.spice.8=$(style.anjuta.comment)
11500 ###############################################################################
11501 # Style for sql from file sql.properties
11503 # White space
11504         style.sql.0=$(style.anjuta.whitespace)
11505 # Comment
11506         style.sql.1=$(style.anjuta.comment)
11507 # Line Comment
11508         style.sql.2=$(style.anjuta.comment)
11509 # Doc comment
11510         style.sql.3=$(style.anjuta.comment)
11511 # Number
11512         style.sql.4=$(style.anjuta.number)
11513 # Keyword
11514         style.sql.5=$(style.anjuta.keyword)
11515 # Double quoted string
11516         style.sql.6=$(style.anjuta.string)
11517 # Single quoted string
11518         style.sql.7=$(style.anjuta.char)
11519 # SQL*Plus
11520         style.sql.8=$(style.anjuta.preprocessor)
11521 # SQL*Plus PROMPT
11522         style.sql.9=$(style.anjuta.preprocessor)
11523 # Operators
11524         style.sql.10=$(style.anjuta.operator)
11525 # SQL*Plus Comment
11526         style.sql.13=$(style.anjuta.comment)
11527 # Hash Line Comment
11528         style.sql.15=$(style.anjuta.comment)
11529 # Keywords2: Database objects
11530         style.sql.16=$(style.anjuta.localkeyword)
11531 # Comment Doc Keyword
11532         style.sql.17=$(style.anjuta.comment)
11533 # Comment Doc Keyword Error
11534         style.sql.18=$(style.anjuta.comment)
11535 # Keywords5: User Keywords 1
11536         style.sql.19=$(style.anjuta.syskeyword)
11537 # Keywords6: User Keywords 2
11538         style.sql.20=$(style.anjuta.extrakeyword)
11539 # Keywords7: User Keywords 3
11540         style.sql.21=$(style.anjuta.syskeyword)
11541 # Keywords8: User Keywords 4
11542         style.sql.22=$(style.anjuta.extrakeyword)
11543 # Quoted identifier
11544         style.sql.23=$(style.anjuta.identifier)
11545 # Q operator
11546         style.sql.24=$(style.anjuta.operator)
11550 ###############################################################################
11551 # Style for srec from file hex.properties
11553 # Record start 'S'
11554         style.srec.1=$(style.anjuta.preprocessor)
11555 # Record type
11556         style.srec.2=$(style.anjuta.attribute)
11557 # Record type unknown
11558         style.srec.3=$(style.anjuta.extrakeyword)
11559 # Byte count field: Correct byte count
11560         style.srec.4=$(style.anjuta.number)
11561 # Byte count field: Wrong byte count
11562         style.srec.5=$(style.anjuta.error)
11563 # Address field: No address
11564         style.srec.6=$(style.anjuta.whitespace)
11565 # Address field: Data address
11566         style.srec.7=$(style.anjuta.number)
11567 # Address field: Record count
11568         style.srec.8=$(style.anjuta.number)
11569 # Address field: Start address
11570         style.srec.9=$(style.anjuta.attribute)
11571 # Address field: Type unknown (this state does not contain any characters)
11572         style.srec.10=$(style.anjuta.error)
11573 # Data odd
11574         style.srec.12=$(style.anjuta.string)
11575 # Data field: Position unknown
11576         style.srec.14=$(style.anjuta.string)
11577 # Checksum field: Correct checksum
11578         style.srec.16=$(style.anjuta.attribute)
11579 # Checksum field: Wrong checksum
11580         style.srec.17=$(style.anjuta.error)
11581 # Garbage data after the record
11582         style.srec.18=$(style.anjuta.comment)
11586 ###############################################################################
11587 # Style for tcl from file tcl.properties
11589 # White space
11590         style.tcl.0=$(style.anjuta.whitespace)
11591 # Comment:.....; #comment
11592         style.tcl.1=$(style.anjuta.comment)
11593 # Line Comment:  #comment
11594         style.tcl.2=$(style.anjuta.comment)
11595 # Number and hex number (syntax #[0-f]+)
11596         style.tcl.3=$(style.anjuta.number)
11597 # Keyword in quote
11598         style.tcl.4=$(style.anjuta.string)
11599 # In quote
11600         style.tcl.5=$(style.anjuta.string)
11601 # operator
11602         style.tcl.6=$(style.anjuta.operator)
11603 # Identifiers
11604         style.tcl.7=$(style.anjuta.keyword)
11605 # Substitution
11606         style.tcl.8=$(style.anjuta.preprocessor)
11607 # Substitution starts with a brace ${woow}
11608         style.tcl.9=$(style.anjuta.preprocessor)
11609 # Modifier -xxx
11610         style.tcl.10=$(style.anjuta.char)
11611 # Expand (what and odd syntax)
11612         style.tcl.11=$(style.anjuta.keyword)
11613 # Keywords
11614         style.tcl.12=$(style.anjuta.localkeyword)
11615 # Keywords 2
11616         style.tcl.13=$(style.anjuta.syskeyword)
11617 # Keywords 3
11618         style.tcl.14=$(style.anjuta.extrakeyword)
11619 # Keywords 4
11620         style.tcl.15=$(style.anjuta.localkeyword)
11621 # Keywords 5
11622         style.tcl.16=$(style.anjuta.syskeyword)
11623 # Keywords 6
11624         style.tcl.17=$(style.anjuta.extrakeyword)
11625 # Keywords 7
11626         style.tcl.18=$(style.anjuta.localkeyword)
11627 # Keywords 8
11628         style.tcl.19=$(style.anjuta.syskeyword)
11629 #comment box
11630         style.tcl.20=$(style.anjuta.comment)
11631 #comment block
11632         style.tcl.21=$(style.anjuta.comment)
11636 ###############################################################################
11637 # Style for tehex from file hex.properties
11639 # Same color scheme as above, comments when differing
11640         style.tehex.0=$(style.anjuta.normal)
11641 # Record start '%'
11642         style.tehex.1=$(style.anjuta.number)
11644         style.tehex.2=$(style.anjuta.number)
11646         style.tehex.3=$(style.anjuta.number)
11648         style.tehex.4=$(style.anjuta.number)
11650         style.tehex.5=$(style.anjuta.number)
11651 # .6 N/A
11652         style.tehex.7=$(style.anjuta.error)
11653 # .8 N/A
11654         style.tehex.9=$(style.anjuta.error)
11655 # Address field: Type unknown (9 digits as usual)
11656         style.tehex.10=$(style.anjuta.keyword)
11657 # .11 N/A
11658         style.tehex.12=$(style.anjuta.error)
11660         style.tehex.13=$(style.anjuta.error)
11661 # .15 N/A
11662         style.tehex.16=$(style.anjuta.error)
11664         style.tehex.17=$(style.anjuta.error)
11666         style.tehex.18=$(style.anjuta.error)
11670 ###############################################################################
11671 # Style for tex from file tex.properties
11673 # Default
11674         style.tex.0=$(style.anjuta.whitespace)
11675 # Special
11676         style.tex.1=$(style.anjuta.keyword)
11677 # Group
11678         style.tex.2=$(style.anjuta.identifier)
11679 # Symbol
11680         style.tex.3=$(style.anjuta.operator)
11681 # Command
11682         style.tex.4=$(style.anjuta.preprocessor)
11686 ###############################################################################
11687 # Style for txt2tags from file txt2tags.properties
11689 # Default
11690         style.txt2tags.0=$(style.anjuta.normal)
11691 # Special
11692         style.txt2tags.1=$(style.anjuta.keyword)
11693 # STRONG
11694         style.txt2tags.2=$(style.anjuta.definition)
11695 # STRONG 2 (not used)
11696         style.txt2tags.3=$(style.anjuta.function)
11697 # EM1 (italic)
11698         style.txt2tags.4=$(style.anjuta.attribute)
11699 # EM2 (underline)
11700         style.txt2tags.5=$(style.anjuta.function)
11701 # H1
11702         style.txt2tags.6=$(style.anjuta.keyword)
11703 # H2
11704         style.txt2tags.7=$(style.anjuta.keyword)
11705 # H3
11706         style.txt2tags.8=$(style.anjuta.keyword)
11707 # H4
11708         style.txt2tags.9=$(style.anjuta.keyword)
11709 # H5
11710         style.txt2tags.10=$(style.anjuta.keyword)
11711 # H6
11712         style.txt2tags.11=$(style.anjuta.keyword)
11713 # prechar (not used)
11714         style.txt2tags.12=$(style.anjuta.char)
11715 # list
11716         style.txt2tags.13=$(style.anjuta.operator)
11717 # list
11718         style.txt2tags.14=$(style.anjuta.operator)
11719 # BLOCKQUOTE
11720         style.txt2tags.15=$(style.anjuta.string)
11721 # STRIKEOUT
11722         style.txt2tags.16=$(style.anjuta.unclosed)
11723 # HRULE
11724         style.txt2tags.17=$(style.anjuta.attribute)
11725 # LINK
11726         style.txt2tags.18=$(style.anjuta.extrakeyword)
11727 # CODE
11728         style.txt2tags.19=$(style.anjuta.syskeyword)
11729 # CODE2
11730         style.txt2tags.20=$(style.anjuta.syskeyword)
11731 # CODEBLOCK
11732         style.txt2tags.21=$(style.anjuta.syskeyword)
11733 # COMMENT
11734         style.txt2tags.22=$(style.anjuta.comment)
11735 # OPTION
11736         style.txt2tags.23=$(style.anjuta.attribute)
11737 # PREPROC
11738         style.txt2tags.24=$(style.anjuta.preprocessor)
11739 # POSTPROC
11740         style.txt2tags.25=$(style.anjuta.preprocessor)
11744 ###############################################################################
11745 # Style for vb from file vb.properties
11747 # Comment
11748         style.vb.1=$(style.anjuta.comment)
11749 # Number
11750         style.vb.2=$(style.anjuta.number)
11751 # Keyword
11752         style.vb.3=$(style.anjuta.keyword)
11753 # String
11754         style.vb.4=$(style.anjuta.string)
11755 # Preprocessor (directives)
11756         style.vb.5=$(style.anjuta.preprocessor)
11757 # Operator
11758         style.vb.6=$(style.anjuta.operator)
11759 # Date
11760         style.vb.8=$(style.anjuta.number)
11761 # End of line where string is not closed
11762         style.vb.9=$(style.anjuta.unclosed)
11763 # Other keywords (bozo test colors :-)
11764         style.vb.10=$(style.anjuta.localkeyword)
11766         style.vb.11=$(style.anjuta.syskeyword)
11768         style.vb.12=$(style.anjuta.extrakeyword)
11772 ###############################################################################
11773 # Style for vbscript from file vb.properties
11775 # VBScript styles same as VB styles
11776         style.vbscript.0=$(style.anjuta.normal)
11778         style.vbscript.1=$(style.anjuta.comment)
11780         style.vbscript.2=$(style.anjuta.number)
11782         style.vbscript.3=$(style.anjuta.keyword)
11784         style.vbscript.4=$(style.anjuta.string)
11786         style.vbscript.5=$(style.anjuta.preprocessor)
11788         style.vbscript.6=$(style.anjuta.operator)
11790         style.vbscript.7=$(style.anjuta.identifier)
11792         style.vbscript.8=$(style.anjuta.number)
11794         style.vbscript.9=$(style.anjuta.unclosed)
11796         style.vbscript.10=$(style.anjuta.localkeyword)
11798         style.vbscript.11=$(style.anjuta.syskeyword)
11800         style.vbscript.12=$(style.anjuta.extrakeyword)
11804 ###############################################################################
11805 # Style for verilog from file verilog.properties
11807 # White space
11808         style.verilog.0=$(style.anjuta.whitespace)
11809 # Comment
11810         style.verilog.1=$(style.anjuta.comment)
11811 # Line Comment
11812         style.verilog.2=$(style.anjuta.comment)
11813 # Bang comment
11814         style.verilog.3=$(style.anjuta.comment)
11815 # Number
11816         style.verilog.4=$(style.anjuta.number)
11817 # Keyword
11818         style.verilog.5=$(style.anjuta.keyword)
11819 # Double quoted string
11820         style.verilog.6=$(style.anjuta.string)
11821 # Keyword2, Secondary keywords and identifiers
11822         style.verilog.7=$(style.anjuta.localkeyword)
11823 # keywords3, System tasks
11824         style.verilog.8=$(style.anjuta.syskeyword)
11825 # Preprocessor
11826         style.verilog.9=$(style.anjuta.preprocessor)
11827 # Operators
11828         style.verilog.10=$(style.anjuta.operator)
11829 # End of line where string is not closed
11830         style.verilog.12=$(style.anjuta.error)
11831 # keywords4, User defined identifiers and tasks
11832         style.verilog.19=$(style.anjuta.extrakeyword)
11833 # comment keyword
11834         style.verilog.20=$(style.anjuta.comment)
11835 # port declare (input output ioput)
11836         style.verilog.21=$(style.anjuta.definition)
11838         style.verilog.22=$(style.anjuta.definition)
11840         style.verilog.23=$(style.anjuta.definition)
11841 # port connection
11842         style.verilog.24=$(style.anjuta.attribute)
11843 # White space
11844         style.verilog.64=$(style.anjuta.whitespace)
11846         style.verilog.65=$(style.anjuta.whitespace)
11848         style.verilog.66=$(style.anjuta.whitespace)
11850         style.verilog.67=$(style.anjuta.whitespace)
11852         style.verilog.68=$(style.anjuta.whitespace)
11854         style.verilog.69=$(style.anjuta.whitespace)
11856         style.verilog.70=$(style.anjuta.whitespace)
11858         style.verilog.71=$(style.anjuta.whitespace)
11860         style.verilog.72=$(style.anjuta.whitespace)
11862         style.verilog.73=$(style.anjuta.whitespace)
11864         style.verilog.74=$(style.anjuta.whitespace)
11866         style.verilog.75=$(style.anjuta.whitespace)
11868         style.verilog.76=$(style.anjuta.whitespace)
11870         style.verilog.83=$(style.anjuta.whitespace)
11872         style.verilog.84=$(style.anjuta.whitespace)
11874         style.verilog.85=$(style.anjuta.whitespace)
11876         style.verilog.86=$(style.anjuta.whitespace)
11878         style.verilog.87=$(style.anjuta.whitespace)
11880         style.verilog.88=$(style.anjuta.whitespace)
11884 ###############################################################################
11885 # Style for vhdl from file vhdl.properties
11887 # White space
11888         style.vhdl.0=$(style.anjuta.whitespace)
11889 # Comment
11890         style.vhdl.1=$(style.anjuta.comment)
11891 # Bang comment
11892         style.vhdl.2=$(style.anjuta.comment)
11893 # Number
11894         style.vhdl.3=$(style.anjuta.number)
11895 # Double quoted string
11896         style.vhdl.4=$(style.anjuta.string)
11897 # End of line where string is not closed
11898         style.vhdl.7=$(style.anjuta.error)
11899 # Keyword
11900         style.vhdl.8=$(style.anjuta.keyword)
11901 # Std operator
11902         style.vhdl.9=$(style.anjuta.operator)
11903 # Attribute
11904         style.vhdl.10=$(style.anjuta.function)
11905 # Std Function
11906         style.vhdl.11=$(style.anjuta.syskeyword)
11907 # Std Package
11908         style.vhdl.12=$(style.anjuta.localkeyword)
11909 # Std Type
11910         style.vhdl.13=$(style.anjuta.syskeyword)
11911 # User defined identifiers and tasks
11912         style.vhdl.14=$(style.anjuta.extrakeyword)
11913 # Block comment
11914         style.vhdl.15=$(style.anjuta.comment)
11918 ###############################################################################
11919 # Style for xml from file html.properties
11921 # Default
11922         style.xml.0=$(style.anjuta.normal)
11923 # Tags
11924         style.xml.1=$(style.anjuta.keyword)
11925 # Unknown Tags
11926         style.xml.2=$(style.anjuta.localkeyword)
11927 # Attributes
11928         style.xml.3=$(style.anjuta.attribute)
11929 # Unknown Attributes
11930         style.xml.4=$(style.anjuta.syskeyword)
11931 # Numbers
11932         style.xml.5=$(style.anjuta.number)
11933 # Double quoted strings
11934         style.xml.6=$(style.anjuta.string)
11935 # Single quoted strings
11936         style.xml.7=$(style.anjuta.char)
11937 # Other inside tag
11938         style.xml.8=$(style.anjuta.identifier)
11939 # Comment
11940         style.xml.9=$(style.anjuta.comment)
11941 # Entities
11942         style.xml.10=$(style.anjuta.attribute)
11943 # XML style tag ends '/>'
11944         style.xml.11=$(style.anjuta.keyword)
11945 # XML identifier start '<?'
11946         style.xml.12=$(style.anjuta.keyword)
11947 # XML identifier end '?>'
11948         style.xml.13=$(style.anjuta.keyword)
11949 # CDATA
11950         style.xml.17=$(style.anjuta.raw)
11951 # Question
11952         style.xml.18=$(style.anjuta.operator)
11953 # Unquoted Value
11954         style.xml.19=$(style.anjuta.raw)
11955 # SGML tags <! ... >
11956         style.xml.21=$(style.anjuta.localkeyword)
11957 # SGML command
11958         style.xml.22=$(style.anjuta.keyword)
11959 # SGML 1st param
11960         style.xml.23=$(style.anjuta.attribute)
11961 # SGML double string
11962         style.xml.24=$(style.anjuta.string)
11963 # SGML single string
11964         style.xml.25=$(style.anjuta.char)
11965 # SGML error
11966         style.xml.26=$(style.anjuta.error)
11967 # SGML special (#xxxx type)
11968         style.xml.27=$(style.anjuta.attribute)
11969 # SGML entity
11970         style.xml.28=$(style.anjuta.attribute)
11971 # SGML comment
11972         style.xml.29=$(style.anjuta.comment)
11973 # SGML block
11974         style.xml.31=$(style.anjuta.preprocessor)
11978 ###############################################################################
11979 # Style for yaml from file yaml.properties
11981 # default
11982         style.yaml.0=$(style.anjuta.normal)
11983 # comment line
11984         style.yaml.1=$(style.anjuta.comment)
11985 # value identifier
11986         style.yaml.2=$(style.anjuta.identifier)
11987 # keyword value
11988         style.yaml.3=$(style.anjuta.keyword)
11989 # numerical value
11990         style.yaml.4=$(style.anjuta.number)
11991 # reference/repeating value
11992         style.yaml.5=$(style.anjuta.localkeyword)
11993 # document delimiting line
11994         style.yaml.6=$(style.anjuta.comment)
11995 # text block marker
11996         style.yaml.7=$(style.anjuta.syskeyword)
11997 # syntax error marker
11998         style.yaml.8=$(style.anjuta.error)
11999 # operator
12000         style.yaml.9=$(style.anjuta.operator)