parsers/smalltalk/stx_goodies_petitparser_parsers_smalltalk.st
changeset 385 44a36ed4e484
child 386 a409905f7f2d
equal deleted inserted replaced
384:a613ecf5d2a1 385:44a36ed4e484
       
     1 "{ Package: 'stx:goodies/petitparser/parsers/smalltalk' }"
       
     2 
       
     3 LibraryDefinition subclass:#stx_goodies_petitparser_parsers_smalltalk
       
     4 	instanceVariableNames:''
       
     5 	classVariableNames:''
       
     6 	poolDictionaries:''
       
     7 	category:'* Projects & Packages *'
       
     8 !
       
     9 
       
    10 
       
    11 !stx_goodies_petitparser_parsers_smalltalk class methodsFor:'accessing - monticello'!
       
    12 
       
    13 monticelloLastMergedVersionInfo
       
    14     "The last merged version is: "
       
    15 
       
    16     ^ '
       
    17     Name: PetitSmalltalk-JanKurs.71
       
    18     Author: JanKurs
       
    19     Time: 19-08-2014, 02:18:05 AM
       
    20     UUID: d1d11836-f3e2-4709-abd3-e2ff3b72d7c4          
       
    21     Repository: http://smalltalkhub.com/mc/Moose/PetitParser/main
       
    22     '
       
    23 
       
    24     "Created: / 03-10-2014 / 02:27:21 / Jan Vrany <jan.vrany@fit.cvut.cz>"
       
    25     "Modified: / 07-10-2014 / 09:14:55 / Jan Vrany <jan.vrany@fit.cvut.cz>"
       
    26 !
       
    27 
       
    28 monticelloName
       
    29     "Return name of the package for Monticello. This is used when package is exported"
       
    30 
       
    31     ^ 'PetitSmalltalk'
       
    32 
       
    33     "Created: / 03-10-2014 / 01:47:26 / Jan Vrany <jan.vrany@fit.cvut.cz>"
       
    34     "Modified: / 07-10-2014 / 09:14:06 / Jan Vrany <jan.vrany@fit.cvut.cz>"
       
    35 ! !
       
    36 
       
    37 !stx_goodies_petitparser_parsers_smalltalk class methodsFor:'accessing - tests'!
       
    38 
       
    39 testSuite
       
    40     "generate and return a testSuite containing all of my test-classes"
       
    41 
       
    42     Smalltalk loadPackage: 'stx:goodies/petitparser/parsers/smalltalk'.
       
    43     ^ 'stx:goodies/petitparser/parsers/smalltalk' asPackageId projectDefinitionClass testSuite
       
    44 
       
    45     "Modified: / 07-10-2014 / 09:16:11 / Jan Vrany <jan.vrany@fit.cvut.cz>"
       
    46 ! !
       
    47 
       
    48 !stx_goodies_petitparser_parsers_smalltalk class methodsFor:'description'!
       
    49 
       
    50 excludedFromPreRequisites
       
    51     "list packages which are to be explicitely excluded from the automatic constructed
       
    52      prerequisites list. If empty, everything that is found along the inheritance of any of
       
    53      my classes is considered to be a prerequisite package."
       
    54 
       
    55     ^ #(
       
    56     )
       
    57 !
       
    58 
       
    59 mandatoryPreRequisites
       
    60     "list packages which are mandatory as a prerequisite.
       
    61      This are packages containing superclasses of my classes and classes which
       
    62      are extended by myself.
       
    63      They are mandatory, because we need these packages as a prerequisite for loading and compiling.
       
    64      This method is generated automatically,
       
    65      by searching along the inheritance chain of all of my classes."
       
    66 
       
    67     ^ #(
       
    68         #'stx:goodies/petitparser'    "PPCompositeParser - superclass of PPSmalltalkGrammar"
       
    69         #'stx:goodies/refactoryBrowser/parser'    "RBProgramNode - extended"
       
    70         #'stx:libbasic'    "LibraryDefinition - superclass of stx_goodies_petitparser_parsers_smalltalk"
       
    71     )
       
    72 !
       
    73 
       
    74 referencedPreRequisites
       
    75     "list packages which are a prerequisite, because they contain
       
    76      classes which are referenced by my classes.
       
    77      We do not need these packages as a prerequisite for loading or compiling.
       
    78      This method is generated automatically,
       
    79      by searching all classes (and their packages) which are referenced by my classes."
       
    80 
       
    81     ^ #(
       
    82         #'stx:libcomp'    "Scanner - referenced by PPSmalltalkGrammar class>>allowUnderscoreAssignment"
       
    83     )
       
    84 !
       
    85 
       
    86 subProjects
       
    87     "list packages which are known as subprojects.
       
    88      The generated makefile will enter those and make there as well.
       
    89      However: they are not forced to be loaded when a package is loaded;
       
    90      for those, redefine requiredPrerequisites."
       
    91 
       
    92     ^ #(
       
    93     )
       
    94 ! !
       
    95 
       
    96 !stx_goodies_petitparser_parsers_smalltalk class methodsFor:'description - contents'!
       
    97 
       
    98 classNamesAndAttributes
       
    99     "lists the classes which are to be included in the project.
       
   100      Each entry in the list may be: a single class-name (symbol),
       
   101      or an array-literal consisting of class name and attributes.
       
   102      Attributes are: #autoload or #<os> where os is one of win32, unix,..."
       
   103 
       
   104     ^ #(
       
   105         "<className> or (<className> attributes...) in load order"
       
   106         PPSmalltalkGrammar
       
   107         PPSmalltalkToken
       
   108         PPSmalltalkTokenParser
       
   109         #'stx_goodies_petitparser_parsers_smalltalk'
       
   110         PPSmalltalkParser
       
   111     )
       
   112 !
       
   113 
       
   114 extensionMethodNames
       
   115     "list class/selector pairs of extensions.
       
   116      A correponding method with real names must be present in my concrete subclasses"
       
   117 
       
   118     ^ #(
       
   119         PPParser smalltalkToken
       
   120         RBProgramNode addComments:
       
   121         RBValueToken inputValue
       
   122     )
       
   123 ! !
       
   124 
       
   125 !stx_goodies_petitparser_parsers_smalltalk class methodsFor:'description - project information'!
       
   126 
       
   127 companyName
       
   128     "Returns a company string which will appear in <lib>.rc.
       
   129      Under win32, this is placed into the dlls file-info"
       
   130 
       
   131     ^ 'eXept Software AG'
       
   132 !
       
   133 
       
   134 description
       
   135     "Returns a description string which will appear in nt.def / bc.def"
       
   136 
       
   137     ^ 'Smalltalk/X Class library'
       
   138 !
       
   139 
       
   140 legalCopyright
       
   141     "Returns a copyright string which will appear in <lib>.rc.
       
   142      Under win32, this is placed into the dlls file-info"
       
   143 
       
   144     ^ 'Copyright Claus Gittinger 1988-2014\nCopyright eXept Software AG 1998-2014'
       
   145 !
       
   146 
       
   147 productName
       
   148     "Returns a product name which will appear in <lib>.rc.
       
   149      Under win32, this is placed into the dlls file-info.
       
   150      This method is usually redefined in a concrete application definition"
       
   151 
       
   152     ^ 'Smalltalk/X'
       
   153 ! !
       
   154 
       
   155 !stx_goodies_petitparser_parsers_smalltalk class methodsFor:'documentation'!
       
   156 
       
   157 version_HG
       
   158     ^ '$Changeset: <not expanded> $'
       
   159 ! !
       
   160