parsers/smalltalk/tests/stx_goodies_petitparser_parsers_smalltalk_tests.st
changeset 385 44a36ed4e484
child 386 a409905f7f2d
equal deleted inserted replaced
384:a613ecf5d2a1 385:44a36ed4e484
       
     1 "{ Package: 'stx:goodies/petitparser/parsers/smalltalk/tests' }"
       
     2 
       
     3 LibraryDefinition subclass:#stx_goodies_petitparser_parsers_smalltalk_tests
       
     4 	instanceVariableNames:''
       
     5 	classVariableNames:''
       
     6 	poolDictionaries:''
       
     7 	category:'* Projects & Packages *'
       
     8 !
       
     9 
       
    10 
       
    11 !stx_goodies_petitparser_parsers_smalltalk_tests 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:41 / 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     ^ 'PetitSmalltalkTests'
       
    32 
       
    33     "Created: / 03-10-2014 / 01:47:26 / Jan Vrany <jan.vrany@fit.cvut.cz>"
       
    34     "Modified: / 07-10-2014 / 09:14:17 / Jan Vrany <jan.vrany@fit.cvut.cz>"
       
    35 ! !
       
    36 
       
    37 !stx_goodies_petitparser_parsers_smalltalk_tests class methodsFor:'description'!
       
    38 
       
    39 excludedFromPreRequisites
       
    40     "list packages which are to be explicitely excluded from the automatic constructed
       
    41      prerequisites list. If empty, everything that is found along the inheritance of any of
       
    42      my classes is considered to be a prerequisite package."
       
    43 
       
    44     ^ #(
       
    45     )
       
    46 !
       
    47 
       
    48 mandatoryPreRequisites
       
    49     "list packages which are mandatory as a prerequisite.
       
    50      This are packages containing superclasses of my classes and classes which
       
    51      are extended by myself.
       
    52      They are mandatory, because we need these packages as a prerequisite for loading and compiling.
       
    53      This method is generated automatically,
       
    54      by searching along the inheritance chain of all of my classes."
       
    55 
       
    56     ^ #(
       
    57 	#'stx:goodies/petitparser/tests'    "PPAbstractParserTest - superclass of PPSmalltalkClassesTests"
       
    58 	#'stx:goodies/sunit'    "TestAsserter - superclass of PPSmalltalkClassesTests"
       
    59 	#'stx:libbasic'    "LibraryDefinition - superclass of stx_goodies_petitparser_parsers_smalltalk_tests"
       
    60     )
       
    61 !
       
    62 
       
    63 referencedPreRequisites
       
    64     "list packages which are a prerequisite, because they contain
       
    65      classes which are referenced by my classes.
       
    66      We do not need these packages as a prerequisite for loading or compiling.
       
    67      This method is generated automatically,
       
    68      by searching all classes (and their packages) which are referenced by my classes."
       
    69 
       
    70     ^ #(
       
    71 	#'stx:goodies/petitparser/parsers/smalltalk'    "PPSmalltalkGrammar - referenced by PPSmalltalkGrammarTests>>parserClass"
       
    72     )
       
    73 !
       
    74 
       
    75 subProjects
       
    76     "list packages which are known as subprojects.
       
    77      The generated makefile will enter those and make there as well.
       
    78      However: they are not forced to be loaded when a package is loaded;
       
    79      for those, redefine requiredPrerequisites."
       
    80 
       
    81     ^ #(
       
    82     )
       
    83 ! !
       
    84 
       
    85 !stx_goodies_petitparser_parsers_smalltalk_tests class methodsFor:'description - contents'!
       
    86 
       
    87 classNamesAndAttributes
       
    88     "lists the classes which are to be included in the project.
       
    89      Each entry in the list may be: a single class-name (symbol),
       
    90      or an array-literal consisting of class name and attributes.
       
    91      Attributes are: #autoload or #<os> where os is one of win32, unix,..."
       
    92 
       
    93     ^ #(
       
    94 	"<className> or (<className> attributes...) in load order"
       
    95 	(PPSmalltalkClassesTests autoload)
       
    96 	(PPSmalltalkGrammarTests autoload)
       
    97 	#'stx_goodies_petitparser_parsers_smalltalk_tests'
       
    98 	(PPSmalltalkParserTests autoload)
       
    99     )
       
   100 
       
   101     "Modified: / 07-10-2014 / 09:22:45 / Jan Vrany <jan.vrany@fit.cvut.cz>"
       
   102 !
       
   103 
       
   104 extensionMethodNames
       
   105     "list class/selector pairs of extensions.
       
   106      A correponding method with real names must be present in my concrete subclasses"
       
   107 
       
   108     ^ #(
       
   109     )
       
   110 ! !
       
   111 
       
   112 !stx_goodies_petitparser_parsers_smalltalk_tests class methodsFor:'description - project information'!
       
   113 
       
   114 companyName
       
   115     "Returns a company string which will appear in <lib>.rc.
       
   116      Under win32, this is placed into the dlls file-info"
       
   117 
       
   118     ^ 'eXept Software AG'
       
   119 !
       
   120 
       
   121 description
       
   122     "Returns a description string which will appear in nt.def / bc.def"
       
   123 
       
   124     ^ 'Smalltalk/X Class library'
       
   125 !
       
   126 
       
   127 legalCopyright
       
   128     "Returns a copyright string which will appear in <lib>.rc.
       
   129      Under win32, this is placed into the dlls file-info"
       
   130 
       
   131     ^ 'Copyright Claus Gittinger 1988-2014\nCopyright eXept Software AG 1998-2014'
       
   132 !
       
   133 
       
   134 productName
       
   135     "Returns a product name which will appear in <lib>.rc.
       
   136      Under win32, this is placed into the dlls file-info.
       
   137      This method is usually redefined in a concrete application definition"
       
   138 
       
   139     ^ 'Smalltalk/X'
       
   140 ! !
       
   141 
       
   142 !stx_goodies_petitparser_parsers_smalltalk_tests class methodsFor:'documentation'!
       
   143 
       
   144 version_HG
       
   145     ^ '$Changeset: <not expanded> $'
       
   146 ! !