AbstractSettingsApplication.st
author Claus Gittinger <cg@exept.de>
Mon, 14 Feb 2011 18:16:30 +0100
changeset 9774 5bde45b1c359
parent 9754 d237d1faea20
child 9792 3786b182781a
permissions -rw-r--r--
automatically generated by browser

"
 COPYRIGHT (c) 2002 by eXept Software AG
              All Rights Reserved

 This software is furnished under a license and may be used
 only in accordance with the terms of that license and with the
 inclusion of the above copyright notice.   This software may not
 be provided or otherwise made available to, or used by, any
 other person.  No title to or ownership of the software is
 hereby transferred.
"
"{ Package: 'stx:libtool' }"

ApplicationModel subclass:#AbstractSettingsApplication
	instanceVariableNames:'settingsString currentUserPrefs rDoitOnlyViaLocalConnection
		modifiedChannel settingsDialog requestor'
	classVariableNames:''
	poolDictionaries:''
	category:'Interface-Smalltalk'
!

AbstractSettingsApplication subclass:#BuildSettingsAppl
	instanceVariableNames:'buildDirectory localBuild'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#ByteCodeCompilerSettingsAppl
	instanceVariableNames:'warnings warnSTX warnDollar warnOldStyle warnCommonMistakes
		warnUnderscore warnCompatibility warnUnusedVars
		warnAboutWrongVariableNames warnAboutBadComments
		warnInconsistentReturnValues
		warnAboutNonLowercaseLocalVariableNames allowQualifiedNames
		allowDollar allowReservedWordsAsSelectors allowOldStyleAssignment
		allowUnderscore allowDolphinExtensions allowSqueakExtensions
		allowVisualAgeESSymbolLiterals allowFixedPointLiterals
		justInTimeCompilation canLoadBinaries constantFoldingSelection
		keepSource constantFolding constantFoldingOptions
		fullDebugSupport immutableArrays enableUnderscore enableDollar
		allowEmptyStatements warnAboutPossibleSTCCompilationProblems
		warnAboutReferenceToPrivateClass warnAboutShortLocalVariableNames
		warnAboutPossiblyUnimplementedSelectors
		allowExtendedBinarySelectors warnAboutMissingMethodComment'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#ChangeFileSettingsAppl
	instanceVariableNames:'classInfos vmInfo vmErrors displayErrors logDoits updChanges
		changeFileName beepForInfoDialog beepForWarningDialog
		beepForErrorDialog flyByHelp beepEnabled beepInEditor'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#CodeGeneratorSettingsAppl
	instanceVariableNames:'generateComments generateCommentsForGetters
		generateCommentsForSetters'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#CommunicationLoggingSettingsAppl
	instanceVariableNames:'logHTTPRequests logSOAPRequests'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#DebuggerSettingsAppl
	instanceVariableNames:'showErrorNotifier verboseBacktraceInDebugger
		allowSendMailFromDebugger useNewLayoutInDebugger'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#DisplaySettingsAppl
	instanceVariableNames:'isColorMonitor useFixGrayPaletteLabel useFixPalette sizeY
		clipEncodingListSelection sizeX monitorList ditherList
		clipEncodingList ditherListSelection deepIcons monitorSelection
		useFixPaletteLabel visualIsPseudoColor ditherSymsNotNil
		useFixGrayPalette sizeInfos screen ditherStyles ditherSyms
		screenDepthVisualLabelHolder maxCopyBufferSize'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#EditSettingsAppl
	instanceVariableNames:'st80EditingMode tabsIs4 st80DoubleClickSelectMode
		searchDialogIsModal startTextDragWithControl
		extendedWordSelectMode whitespaceWordSelectMode
		enforceContentsDropForFiles'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#FontSettingsAppl
	instanceVariableNames:'filter allOfThem labelDef buttonDef listDef menuDef textDef
		allFontLabelHolder buttonsFontLabelHolder textFontLabelHolder
		labelsFontLabelHolder listsFontLabelHolder menusFontLabelHolder
		allLabel buttonsLabel textLabel labelLabel listsLabel menuLabel
		inputFieldLabel inputFieldDef inputFieldFontLabelHolder'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#GeneralCompilerSettingsAppl
	instanceVariableNames:'st80EditingMode tabsIs4 st80DoubleClickSelectMode
		searchDialogIsModal startTextDragWithControl catchClassRedefs
		fullHistoryUpdate historyLines keepSourceSelection keepSource
		hasHistoryManager canLoadBinaries loadBinaries catchMethodRedefs
		userNameInHistoryHolder'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#HTTPStartServerSettingsApplication
	instanceVariableNames:'portNumberChannel informationLabel hasNoCreatedServerChannel
		hasCreatedServerChannel useFcgiHolder'
	classVariableNames:'CreatedServers'
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#KbdMappingSettingsAppl
	instanceVariableNames:'selectedRawKey macroTextHolder selectedFunctionKey
		labelTextHolder functionKeyList rawKeyList mappings'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#LanguageSettingsAppl
	instanceVariableNames:'languageHolder languageIndexHolder languageList
		languageListHolder listOfLanguages translatedLanguages
		noticeLabelHolder currentFlagAndLanguageChannel
		currentLanguageLabel perLanguageResources'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#MemorySettingsAppl
	instanceVariableNames:'newSpaceSize maxOldSpace fastMoreLimit warningLabelHolder
		codeTrigger codeLimit oldIncr compressLimit igcFreeLimit igcLimit
		igcFreeAmount stackLimit supportsJustInTimeCompilation
		methodCodeSizeLimit'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#MiscCommunicationSettingsAppl
	instanceVariableNames:'remoteBrowsingEnabled windowMigrationEnabled
		windowMigrationPassword windowMigrationAuthenticate
		enablePasswordCheck smallTeamServerEnabled selectedSmallTeamHost
		listOfSmallTeamHosts smallTeamHostEntry addHostEnabled
		removeHostEnabled acceptChannel smtpServerName
		dotNetBridgeVerbose dotNetBridgeRunsInIDE'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#MiscDisplay2SettingsAppl
	instanceVariableNames:'nativeWidgets nativeDialogs shadows opaqueVariablePanelResize
		opaqueTableColumnResize lowerOnRightClickInTitle
		lowerOnShiftClickInTitle displaySupportsNativeFileDialogs
		nativeFileDialogs'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#MiscDisplaySettingsAppl
	instanceVariableNames:'returnFocus focusFollowsMouse mouseWheelFocusFollowsMouse
		beepEnabled takeFocus activateOnClick
		formatHostNameinWindowLabels hostNameInLabelHolder
		showAccelerators newWindowLabelFormat formatHostNameWindowLabel
		selectOnRightClick popUpMenuOnRelease
		showRightButtonMenuOnRelease formatHostNameWindowLabel1
		formatHostNameWindowLabel2 allowMouseWheelZoom
		forceWindowsIntoMonitorBounds'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#OsiSettingsAppl
	instanceVariableNames:'osiACSEConnectionLogging osiROSEErrorLogging osiCMISEErrorLogging
		osiACSEErrorLogging osiROSEPresent osiCMISEPresent
		osiCMISEMessageLogging osiACSEDataLogging
		osiROSEInvokationLogging osiACSEPresent osiROSEResponseLogging'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#PrinterSettingsAppl
	instanceVariableNames:'selectedUnit supportsColor topMargin rightMargin bottomMargin
		landscape pageFormatList pageFormat unitList leftMargin
		possiblePrinters printerType printerTypeSelection
		printCommandList commandList printCommand printFilename
		enableFormat enablelandscape enableMargins enableColorBox
		printerIsDrivenByCommand printerSupportsPrintingToFile
		supportsPageFormatSetting supportsMarginSetting
		supportsColorSetting'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#ProcessorSchedulerSettingsAppl
	instanceVariableNames:'dynamicPrios preemptive'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#RDoItServerSettingsAppl
	instanceVariableNames:'rDoitLogging rDoitsEnabled rDoitErrorLogging hasRDoitServer
		rDoitErrorDebugging rDoitServerPortOrPath
		rDoitEnabledOnlyViaLocalConnection scriptingEnabled
		scriptingEnabledOnlyViaLocalConnection scriptingErrorDebugging
		scriptingErrorLogging scriptingLogging scriptingServerPortOrPath'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#SQLServerSettingsAppl
	instanceVariableNames:'sqlServerEnabled sqlSmalltalkServerEnabled sqlLogging
		sqlDataLogging sqlErrorLogging hasSQLServer sqlErrorDebugging
		sqlServerPort sqlStatementLogging'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#STCCompilerSettingsAppl
	instanceVariableNames:'cc ccOptions stcIncludes linkCommand stc linkArgs linkSharedArgs
		canLoadBinaries stcDefines stcLibraries stcOptions stcLibraryPath
		stcCompilationSelection stcCompilationList makeCommand'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#SourceCodeFormatSettingsAppl
	instanceVariableNames:'spaceAfterKeywordSelector emptyLineAfterTemporaries tabIndent
		autoFormat cStyleBlocks editorText maxLengthForSingleLineBlocks
		blockArgumentsOnNewLine spaceAfterReturnToken
		spaceAroundTemporaries spaceAfterBlockStart spaceBeforeBlockEnd
		oldUserPreferences reformatLocked'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#SourceCodeManagementSettingsAppl
	instanceVariableNames:'sourceCacheDir useManager availableManagers condenseSourceCache
		setupSourceCodeManager checkClassesWhenCheckingIn
		formattingConfiguration flushSourceCache localSourceFirst
		repositoryHolder manager repository listOfModules
		cvsRootPrototypeList addPerModuleRoot removeEnabled
		perModuleRootModule acceptChannel removePerModuleRoot
		perModuleRoot cvsRootHolder selectedPerModuleRoot
		cvsBinDirectoryHolder cvsExecutableHolder rootsPerModule
		cvsLoginInModuleEnabled cvsLoginEnabled
		selectedManagerTypeIndexHolder managerIsCVSSourceCodeManager
		managerIsStoreSourceCodeManager storeLoginEnabled
		storeHostPrototypeList storeHostnameHolder storeUsernameHolder
		storePasswordHolder perStoreModuleHostnameHolder
		perStoreModuleUsernameHolder perStoreModulePasswordHolder
		perStoreModuleRoot perStoreModuleRootModule
		selectedPerStoreModuleRoot storeConnectEnabled
		storeConnectInModuleEnabled perModuleFieldsEnableHolder
		managerIsSmallTeamSourceCodeManager
		selectedPerSmallTeamModuleRoot
		perSmallTeamModuleFieldsEnableHolder perSmallTeamModuleRoot
		perSmallTeamModuleRootModule perSmallTeamModuleHostnameHolder
		smallTeamHostnameHolder verboseSourceCodeAccess keepMethodSource'
	classVariableNames:'RecentlyUsedCVSRoots RecentlyUsedStoreHosts
		RecentlyUsedSmallTeamHosts LastStoreHost LastStoreUser
		LastStorePassword'
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#StyleSettingsAppl
	instanceVariableNames:'showStandardStylesOnly styleList selectedStyle
		styleDirectoryContents infoLabelHolder noticeLabelHolder
		previewVisibleHolder'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#SyntaxColorSettingsAppl
	instanceVariableNames:'coloredText syntaxColor syntaxColors resetList resetListSelection
		fullSelectorCheck syntaxColoring oldUserPreferences
		syntaxFontSelector syntaxFonts syntaxElementList
		syntaxElementSelection syntaxEmphasisList syntaxEmphasisSelection
		emphasisDictionary resetListDictionary'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#SystemBrowserSettingsAppl
	instanceVariableNames:'showAcceptCancelBarInBrowser useSearchBarInBrowser'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#SystemMessageSettingsAppl
	instanceVariableNames:'classInfos vmInfo vmErrors displayErrors logDoits updChanges
		changeFileName beepForInfoDialog beepForWarningDialog
		beepForErrorDialog flyByHelp beepEnabled beepInEditor
		toolTipAutoHideDelay'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

AbstractSettingsApplication subclass:#ToolsSettingsAppl
	instanceVariableNames:'useNewVersionDiffBrowser transcriptBufferSize useNewInspector
		showClockInLauncher useNewChangesBrowser useNewFileBrowser
		useNewSystemBrowser useNewFileDialog useNewSettingsApplication
		useProcessMonitorV2 useSmalltalkDocumentViewer
		showTipOfTheDayAtStartup autoRaiseTranscript'
	classVariableNames:''
	poolDictionaries:''
	privateIn:AbstractSettingsApplication
!

!AbstractSettingsApplication class methodsFor:'documentation'!

copyright
"
 COPYRIGHT (c) 2002 by eXept Software AG
              All Rights Reserved

 This software is furnished under a license and may be used
 only in accordance with the terms of that license and with the
 inclusion of the above copyright notice.   This software may not
 be provided or otherwise made available to, or used by, any
 other person.  No title to or ownership of the software is
 hereby transferred.
"
!

documentation
"
    This is an abstract framework for settings applications.
    For a real settings dialog, you need a concrete settings dialog class to hold the pages
    (as an example, see SettingsDialog)
    and someone who specifies the hierarchy of settings-pages in a spec.
    (as an example, see NewLauncher class>>defaultSettingsApplicationList)

    typical use:

        |settingsList settingsApp|

        settingsList := NewLauncher settingsList.

        settingsApp := SettingsDialog new.
        'settingsApp requestor:requestingApplication'.
        settingsApp installSettingsEntries:settingsList.
        settingsApp allButOpen.
        settingsApp window label:('ST/X Settings').
        settingsApp openWindow.

"
! !

!AbstractSettingsApplication class methodsFor:'defaults'!

classResources

    ^ AbstractLauncherApplication classResources
!

resourcePackName
    "return the name which is used as the fileNameBase of my resource file.
     Here, use the same resources as the Launcher"

    ^ AbstractLauncherApplication resourcePackName
!

subEntryRawSettingsList
    ^ #()

    "Created: / 25-10-2010 / 09:37:21 / cg"
! !

!AbstractSettingsApplication class methodsFor:'interface specs'!

windowSpec
    self subclassResponsibility
! !

!AbstractSettingsApplication class methodsFor:'queries'!

isVisualStartable
    "return true, if this application can be started via #open.
     (to allow start of a change browser via double-click in the browser)"

    (self == AbstractSettingsApplication) ifTrue:[^ false "I am abstract"].
    ^ super isVisualStartable
! !

!AbstractSettingsApplication methodsFor:'accessing'!

requestor:anotherApplication
    requestor := anotherApplication.

    "Modified: / 12-05-2010 / 17:16:37 / cg"
!

settingsDialog
    ^ settingsDialog
!

settingsDialog:aSettingsDialog
    settingsDialog := aSettingsDialog.

    "Modified: / 12-05-2010 / 18:44:09 / cg"
! !

!AbstractSettingsApplication methodsFor:'actions'!

evaluateModified
    <resource: #obsolete>
    self obsoleteMethodWarning.
    ^ self updateModifiedChannel.
!

readSettings
    self basicReadSettings.

    self modifiedChannel value:false.
!

reopenToolsAfterChangedViewStyleSetting
    |app transcript|

    DebugView newDebugger.
    transcript := Transcript current.
    (transcript notNil and:[transcript isExternalStream not]) ifTrue:[
        app := transcript topView application.
        (app respondsTo:#reopenLauncher) ifTrue:[
            app reopenLauncher.
        ].
    ].
!

saveRequest
    ^ self saveRequestAsking:self askForChangeOnRelease
!

saveRequestAsking:askForChangeOnRelease
    |result|

    self hasUnsavedChanges ifTrue:[
        askForChangeOnRelease ifTrue:[
            result := self confirmWithCancel:(self resources 
                                string:'Apply changes made in %1 ?' 
                                with:(resources string:settingsString) allBold).
        ] ifFalse:[
            result := true.
        ].

        result isNil ifTrue:[
            ^ false
        ].
        result ifTrue:[
            self saveSettings
        ] ifFalse:[
            "/ reload current settings to show the right thing when re-entering.
            self readSettings
        ]
    ].
    ^ true

    "Modified: / 20-09-2006 / 23:56:25 / cg"
!

saveSettings
    self basicSaveSettings.

    self modifiedChannel value:false.
!

saveSettingsIfUnsavedChangesArePresent
    self hasUnsavedChanges ifTrue:[
        self saveSettings.
        self modifiedChannel value:false
    ].
!

updateModifiedChannel
    self modifiedChannel value:self hasUnsavedChanges
! !

!AbstractSettingsApplication methodsFor:'aspects'!

modifiedChannel

    modifiedChannel isNil ifTrue:[
        modifiedChannel := false asValue.
    ].
    ^ modifiedChannel
! !

!AbstractSettingsApplication methodsFor:'helpers'!

hasChangedAspectIn:aListOfAspects asComparedTo:anAspectProvider
    "this code-sharing helper compares a bunch of aspect value against some object.
     The object is typically the current userPreferences object, or a flag-holder, such
     as ParserFlags.
     Using this, and a list of aspect selectors replaces code like:
        someone aspect1 ~= (self aspect1 value) ifTrue:[^ true].
        someone aspect2 ~= (self aspect2 value) ifTrue:[^ true].
        ...
        someone aspectN ~= (self aspectN value) ifTrue:[^ true].
        ^ false
     Prerequisite:
        local aspects must be named like corresponding aspect methods in the flag-provider.
    "

    aListOfAspects do:[:eachAspectSymbol |
        (self perform:eachAspectSymbol) value ~= (anAspectProvider perform:eachAspectSymbol) ifTrue:[^ true].
    ].
    ^ false
!

readAspects:aListOfAspects from:anAspectProvider
    "this code-sharing helper reads a bunch of aspect values from some object.
     The object is typically the current userPreferences object, or a flag-holder, such
     as ParserFlags.
     Using this, and a list of aspect selectors replaces code like:
        self aspect1 value:(someone aspect1).
        self aspect2 value:(someone aspect2).
        ...
        self aspectN value:(someone aspectN).
     Prerequisite:
        local aspects must be named like corresponding aspect methods in the flag-provider.
    "

    aListOfAspects do:[:eachAspectSymbol |
        (self perform:eachAspectSymbol) 
            value:(anAspectProvider perform:eachAspectSymbol)
            withoutNotifying:self
    ].

    "Modified: / 08-02-2011 / 09:11:03 / cg"
!

writeAspects:aListOfAspects to:anAspectProvider
    "this code-sharing helper writes a bunch of aspect values into some object.
     The object is typically the current userPreferences object, or a flag-holder, such
     as ParserFlags.
     Using this, and a list of aspect selectors replaces code like:
        someone aspect1:(self aspect1 value).
        someone aspect2:(self aspect2 value).
        ...
        someone aspectN:(self aspectN value).
     Prerequisite:
        local aspects must be named like corresponding aspect methods in the flag-provider.
    "

    aListOfAspects do:[:eachAspectSymbol |   
        anAspectProvider perform:(eachAspectSymbol,':')asSymbol with:(self perform:eachAspectSymbol) value
    ].

    "Modified: / 24-08-2010 / 16:52:42 / sr"
! !

!AbstractSettingsApplication methodsFor:'initialization'!

initialize
    super initialize.
    resources := self class classResources.
    currentUserPrefs isNil ifTrue:[ self initializeCurrentUserPreferences ].
    settingsString := (UISpecification from:(self class windowSpec)) window label.
    "/ self readSettings.

    "Modified: / 12-05-2010 / 17:27:44 / cg"
!

initializeCurrentUserPreferences
    currentUserPrefs := UserPreferences current.
! !

!AbstractSettingsApplication methodsFor:'menu'!

settingsDialogPopUpMenu
    ^ nil
! !

!AbstractSettingsApplication methodsFor:'protocol'!

askForChangeOnRelease
    ^ true "/ false
!

basicReadSettings
    self subclassResponsibility
!

basicSaveSettings

    self subclassResponsibility.
!

help
    |filename|

    filename := self helpFilename.
    filename isNil ifTrue:[
        self warn:(self resources string:'Sorry - no Help available here.').
        ^ self.
    ].
    self withWaitCursorDo:[
        HTMLDocumentView openFullOnHelpFile:filename
    ].
!

helpFilename
    "subclasses must return the relative name of a helpFile
     in the doc/online/<language>/help directory.
     Or nil, if no help is available."

    Smalltalk isStandAloneApp ifFalse:[
        self subclassResponsibility.
    ].
    ^ nil.
! !

!AbstractSettingsApplication methodsFor:'queries'!

hasUnsavedChanges

    ^ self subclassResponsibility
!

isEnabledInSettingsDialog:aSettingsDialog
    ^ true

    "Created: / 25-01-2007 / 16:47:45 / cg"
!

itemPathName
    ^ settingsDialog getNameOfApplication:self.
! !

!AbstractSettingsApplication::BuildSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ AbstractSettingsApplication::ByteCodeCompilerSettingsAppl defaultIcon4

    "Modified: / 17-09-2007 / 11:35:02 / cg"
! !

!AbstractSettingsApplication::BuildSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::BuildSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::BuildSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::BuildSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Build Settings'
          name: 'Build Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 659 551)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel3'
              layout: (LayoutFrame 0 0 0 0 0 1 0 1)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 4
              component: 
             (SpecCollection
                collection: (
                 (FramedBoxSpec
                    label: 'Build Directory'
                    name: 'FramedBox1'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Build Directory'
                          layout: (LayoutFrame 0 0 0 0 0 1 30 0)
                          component: 
                         (SpecCollection
                            collection: (
                             (LabelSpec
                                label: 'Build Directory:'
                                name: 'BuildDirDirLabel'
                                layout: (LayoutFrame 0 0.0 0 0 60 0.25 22 0)
                                translateLabel: true
                                adjust: right
                              )
                             (FilenameInputFieldSpec
                                name: 'FilenameEntryField1'
                                layout: (LayoutFrame 221 0 0 0 0 1 22 0)
                                enableChannel: localBuild
                                model: buildDirectory
                                acceptOnReturn: true
                                acceptOnTab: true
                                acceptOnLostFocus: true
                                acceptOnPointerLeave: true
                                viewClassName: FilenameWidgetWithHistory
                                postBuildCallback: postBuildDirectoryField:
                              )
                             )
                           
                          )
                        )
                       (HorizontalPanelViewSpec
                          name: 'ActionsHorizontalPanel'
                          layout: (LayoutFrame 62 0.25 27 0 0 1 56 0)
                          horizontalLayout: fitSpace
                          verticalLayout: center
                          horizontalSpace: 3
                          verticalSpace: 3
                          component: 
                         (SpecCollection
                            collection: (
                             (ActionButtonSpec
                                label: 'Cleanup Build Directory'
                                name: 'CleanupBuildDirectoryButton'
                                translateLabel: true
                                tabable: true
                                model: cleanupBuildDirectory
                                extent: (Point 401 22)
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                    extent: (Point 659 91)
                  )
                 (ViewSpec
                    name: 'LocalBuild'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Local Build (Do not use Repository)'
                          name: 'CheckBox4'
                          layout: (LayoutFrame 2 0 5 0 -5 1 27 0)
                          enableChannel: hasSourceCodeManager
                          model: localBuild
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 659 25)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::BuildSettingsAppl methodsFor:'actions'!

basicReadSettings
    self 
        readAspects:
            #( 
                buildDirectory
                localBuild
            )
        from:currentUserPrefs.
!

basicSaveSettings
    |buildDir|

    buildDir := buildDirectory value.
    buildDir notEmptyOrNil ifTrue:[
        buildDir := buildDir asFilename.
        buildDir isDirectory ifFalse:[
            (Dialog confirm:(resources 
                        stringWithCRs:'Build directory %1 does not exist.\\Create?' 
                        with:buildDir pathName allBold))
            ifTrue:[
                buildDir makeDirectory.
            ]
        ].
    ].

    self 
        writeAspects:
            #( 
                buildDirectory
                localBuild
            )
        to:currentUserPrefs.
!

cleanupBuildDirectory
    |buildDir|

    buildDir := buildDirectory value.
    buildDir isEmptyOrNil ifTrue:[
        ^ self.
    ].
    buildDir := buildDir asFilename.
    (buildDir exists and:[Dialog confirm:('Really delete <1p> ?' expandMacrosWith:buildDir physicalPathName)]) ifTrue:[
        buildDir recursiveRemove.
        buildDir makeDirectory.
    ].
! !

!AbstractSettingsApplication::BuildSettingsAppl methodsFor:'aspects'!

buildDirectory
    buildDirectory isNil ifTrue:[
        buildDirectory := ValueHolder new.
        buildDirectory onChangeSend:#updateModifiedChannel to:self
    ].
    ^ buildDirectory.
!

hasSourceCodeManager
    ^ SourceCodeManager notNil
!

localBuild
    localBuild isNil ifTrue:[
        localBuild := UserPreferences current localBuild asValue.
        localBuild onChangeSend:#updateModifiedChannel to:self
    ].
    ^ localBuild.
! !

!AbstractSettingsApplication::BuildSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/buildSetup.html'
! !

!AbstractSettingsApplication::BuildSettingsAppl methodsFor:'initialization'!

postBuildDirectoryField:aField
    aField historyList value:(Array 
        with:(OperatingSystem getHomeDirectory asFilename construct:'stx_build') pathName
        with:(Filename currentDirectory construct:'stx_build') pathName)
! !

!AbstractSettingsApplication::BuildSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    (self
        hasChangedAspectIn:
            #(
                buildDirectory
                localBuild
            )
        asComparedTo:currentUserPrefs) ifTrue:[^ true].

    ^ false
! !

!AbstractSettingsApplication::ByteCodeCompilerSettingsAppl class methodsFor:'defaults'!

constantFoldingOptions

    ^ #( nil #level1 #level2 #full )
!

constantFoldingStrings

    ^ #('disabled' 'level1 (always safe)' 'level2 (usually safe)' 'full')
! !

!AbstractSettingsApplication::ByteCodeCompilerSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ self defaultIcon5

    "Modified: / 17-09-2007 / 11:35:05 / cg"
!

defaultIcon1
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon1 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon1
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::ByteCodeCompilerSettingsAppl class defaultIcon1'
        ifAbsentPut:[(Depth2Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#[2]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@C??????@CUUUUUW@CZ(J@B''@CZ""(*''CCZ"*(*''@CV(J(*WKCV*"(*W@CU""()WJCU(J()W@CUZ**%W@CUZ**%WACUPJ(EW@CUR""QWDCUQ"!!UWI
CUPJ!!UWICUQR!!UWJCUQR!!QWACUPFTEW@CUUUUUW@C??????@@@@@@@@B') ; colorMapFromArray:#[0 0 0 255 255 255 255 189 23 127 127 127]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8@@@@') ; yourself); yourself]
!

defaultIcon2
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon2 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon2
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::ByteCodeCompilerSettingsAppl class defaultIcon2'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD@0LDA@PDA@PDA@PDA@PDA@PD
A@PDA@LCA PCA@P@@@@@@@@@@@@@@@@@@@@D@0PFA PCA@PC@0@@@@@@@@@@@@@C@0@D@0PFAPTD@0LDA L@@@@@@@@@@@LFA@LCA@TEAPTEA@PE@PL@@@@@
@@@@@@LAAPPDAPTEAPTEAPTF@0@@@@@@@@@@@@@CA TEAPTEA DFAPTD@0@@@@@@@@@@@@@CA@TEA DF@0LAA TEA@LC@@@@@@@@@0LDAPTF@PLC@ HC@PTE
APPD@0@@@@@CA@PEAPTA@0HB@ HCA TEAPDA@0@@@@@C@PDEAPTF@0HB@0LDAPTFA LC@@@@@@@@@0LFA TEA@LCA@PEAPTF@0PD@@@@@@@@@@PCA TEAPPD
APTEAPTD@0PDA@@@@@@@A@PCA@TEAPTEAPTEA DEA@LDA@@@@@@@A@LDAPDFAPTEAPTD@0LAA LDA@P@@@@DA@LF@PLCA@TE@PPCA@PC@0PDA@P@@@@DA@PC
@0PD@0PA@PPCA@PDA@PDA@PD@@PDA@PDA@PD@0PA@0LDA@PDA@PDA@PDA@PDA@PDA@PDA@LCA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD') ; colorMapFromArray:#[255 189 23 127 127 127 236 233 216 0 0 0 255 255 255 194 194 194 161 161 165]; yourself]
!

defaultIcon3
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon3 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon3
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::ByteCodeCompilerSettingsAppl class defaultIcon3'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PD
A@PDA@PDA@PDA@PDA@PDA@LDA LDA@PDA@PDA@PDA@PDA@PD@0LDA@LDA LDA@LCA@PDA@PDA@PDA@PCA PC@0PEAPPC@0PF@0PDA@PDA@PDA@PC@PTDA@TE
APTDA@TA@0PDA@PDA@PDA@PD@0XEAPTEAPTEAPXCA@PDA@PDA@PDA@PD@0PEAPXAA XEAPPCA@PDA@PDA@PDA@LCA@TEA DC@0DFAPTD@0LDA@PDA@PD@0PD
APTE@PLB@ LAAPTEA@PCA@P@A@PD@0DAAPTEA LB@ LFAPTE@PDCA@P@A@PDA@LCA XEAPPC@0PEAPXF@0LDA@PDA@PDA@PD@0XEAPTDA@TEAPXCA@PDA@PD
A@PDA@PD@0PEAPTEAPTEAPPCA@PDA@PDA@PDA@PCA@TAA TEAPTF@PTD@0PDA@PDA@PDA@PCA DC@0PEAPPC@0DF@0PDA@PDA@PDA@PD@0LDA@LD@PLDA@LC
A@PDA@PDA@PDA@PDA@PDA@LD@PLDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD') ; colorMapFromArray:#[255 189 23 127 127 127 236 233 216 0 0 0 255 255 255 194 194 194 161 161 165]; mask:((Depth1Image new) width: 24; height: 24; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@A @@C0@@33@A?? A?? @??@@??@C??0G??8G??8C??0@??@@??@A?? A?? @33@@C0@@A @@@@@@@@@@@@@') ; yourself); yourself]
!

defaultIcon4
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon4 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon4
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::ByteCodeCompilerSettingsAppl class defaultIcon4'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PD
A@PDA@PDA@PDA@PDA@PDA@LDA LDA@PDA@PDA@PDA@PDA@PD@0LDA@LDA LDA@LCA@PDA@PDA@PDA@PCA PC@0PEAPPC@0PF@0PDA@PDA@PDA@PC@PTDA@TE
APTDA@TA@0PDA@PDA@PDA@PD@0XEAPTEAPTEAPXCA@PDA@PDA@PDA@PD@0PEAPXAA XEAPPCA@PDA@PDA@PDA@LCA@TEA DC@0DFAPTD@0LDA@PDA@PD@0PD
APTE@PLB@ LAAPTEA@PCA@P@A@PD@0DAAPTEA LB@ LFAPTE@PDCA@P@A@PDA@LCA XEAPPC@0PEAPXF@0LDA@PDA@PDA@PD@0XEAPTDA@TEAPXCA@PDA@PD
A@PDA@PD@0PEAPTEAPTEAPPCA@PDA@PDA@PDA@PCA@TAA TEAPTF@PTD@0PDA@PDA@PDA@PCA DC@0PEAPPC@0DF@0PDA@PDA@PDA@PD@0LDA@LD@PLDA@LC
A@PDA@PDA@PDA@PDA@PDA@LD@PLDA@PDA@PDA@PDA@PD@0PD@0PD@0PC@0PD@0PD@0PCA@PDA@PCA@LD@0PD@0PD@PPCA@LD@0PCA@PDA@PCA@LD@0PD@0PD
@0PCA@LD@0PCA@PDA@PD@0PD@0PD@0PD@0PD@0PD@0PCA@PD') ; colorMapFromArray:#[255 189 23 127 127 127 236 233 216 0 0 0 255 255 255 194 194 194 161 161 165]; mask:((Depth1Image new) width: 24; height: 24; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@A @@C0@@33@A?? A?? @??@@??@C??0G??8G??8C??0@??@@??@A?? A?? @33@@C0@D%$(J$*(J$*(D$$(') ; yourself); yourself]
!

defaultIcon5
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon5 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon5
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::ByteCodeCompilerSettingsAppl class defaultIcon5'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PD
A@PDA@PDA@PDA@PDA@PDA@LDA LDA@PDA@PDA@PDA@PDA@PD@0LDA@LDA LDA@LCA@PDA@PDA@PDA@PCA PC@0PEAPPC@0PF@0PDA@PDA@PDA@PC@PTDA@TE
APTDA@TA@0PDA@PDA@PDA@PD@0XEAPTEAPTEAPXCA@PDA@PDA@PDA@PD@0PEAPXAA XEAPPCA@PDA@PDA@PDA@LCA@TEA DC@0DFAPTD@0LDA@PDA@PD@0PD
APTE@PLB@ LAAPTEA@PCA@P@A@PD@0DAAPTEA LB@ LFAPTE@PDCA@P@A@PDA@LCA XEAPPC@0PEAPXF@0LDA@PDA@PDA@PD@0XEAPTDA@TEAPXCA@PDA@PD
A@PDA@PD@0PEAPTEAPTEAPPCA@PDA@PDA@PDA@PCA@TAA TEAPTF@PTD@0PDA@PDA@PDA@PCA DC@0PEAPPC@0DF@0PDA@PDA@PDA@PD@0LDA@LD@PLDA@LC
A@PDA@PDA@PDA@PDA@PDA@LD@PLDA@PDA@PDA@PDA@PC@0LC@0LD@0PC@0PC@@LC@0LC@0PDA@PC@@@@@@LD@0PD@PPC@@LD@@@@@0PDA@PCA@@@@@LD@0PD
@@PC@@LD@@P@@0PDA@PC@0LC@0LD@0LC@0LC@@LC@0LC@0PD') ; colorMapFromArray:#[255 189 23 127 127 127 236 233 216 0 0 0 255 255 255 194 194 194 161 161 165]; mask:((Depth1Image new) width: 24; height: 24; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@A @@C0@@33@A?? A?? @??@@??@C??0G??8G??8C??0@??@@??@A?? A?? @33@@C0@O5+<HT*DHTJDO7;<') ; yourself); yourself]
! !

!AbstractSettingsApplication::ByteCodeCompilerSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::ByteCodeCompilerSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::ByteCodeCompilerSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::ByteCodeCompilerSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Byte Code Compiler Settings'
          name: 'Byte Code Compiler Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 665 706)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Just in Time Compilation to Machine Code'
                    name: 'JustInTimeCompilation'
                    model: justInTimeCompilation
                    translateLabel: true
                    extent: (Point 665 25)
                  )
                 (DividerSpec
                    name: 'Separator3'
                    extent: (Point 665 3)
                  )
                 (ViewSpec
                    name: 'Box1'
                    component: 
                   (SpecCollection
                      collection: (
                       (VerticalPanelViewSpec
                          name: 'VerticalPanel1_1'
                          layout: (LayoutFrame 0 0 0 0 -20 0.5 0 1)
                          horizontalLayout: fit
                          verticalLayout: top
                          horizontalSpace: 3
                          verticalSpace: 0
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Allow Underscore in Identifiers'
                                name: 'AllowUnderscoreInIdentifiers'
                                model: allowUnderscoreInIdentifier
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow Dollar in Identifiers'
                                name: 'AllowDollarInIdentifiers'
                                model: allowDollarInIdentifier
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow VW3 QualifiedNames'
                                name: 'AllowVW3QualifiedNames'
                                model: allowQualifiedNames
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow OldStyle Assignment (_)'
                                name: 'AllowOldStyleAssignment'
                                model: allowOldStyleAssignment
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow Reserved Words as Selector (self)'
                                name: 'AllowReservedWordsAsSelector'
                                model: allowReservedWordsAsSelectors
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow Extended Binary Selectors'
                                name: 'CheckBox4'
                                model: allowExtendedBinarySelectors
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             )
                           
                          )
                        )
                       (VerticalPanelViewSpec
                          name: 'VerticalPanel1_2'
                          layout: (LayoutFrame 0 0.5 0 0 0 1 0 1)
                          horizontalLayout: left
                          verticalLayout: top
                          horizontalSpace: 3
                          verticalSpace: 0
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Allow Squeak Extensions'
                                name: 'AllowSqueakExtensions'
                                model: allowSqueakExtensions
                                translateLabel: true
                                extent: (Point 665 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow Dolphin Extensions'
                                name: 'AllowDolphinExtensions'
                                model: allowDolphinExtensions
                                translateLabel: true
                                extent: (Point 665 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow VisualAge ES-Symbols'
                                name: 'AllowVisualAgeESSymbolLiterals'
                                model: allowVisualAgeESSymbolLiterals
                                translateLabel: true
                                extent: (Point 665 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow FixedPoint-Number Literals'
                                name: 'AllowFixedPointLiterals'
                                model: allowFixedPointLiterals
                                translateLabel: true
                                extent: (Point 665 22)
                              )
                             (CheckBoxSpec
                                label: 'Allow Empty Statements'
                                name: 'AllowEmptyStatements'
                                model: allowEmptyStatements
                                translateLabel: true
                                extent: (Point 665 22)
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                    extent: (Point 665 137)
                  )
                 (DividerSpec
                    name: 'Separator4'
                    extent: (Point 665 1)
                  )
                 (CheckBoxSpec
                    label: 'Warnings'
                    name: 'Warnings'
                    model: warnings
                    translateLabel: true
                    extent: (Point 665 22)
                  )
                 (ViewSpec
                    name: 'Box2'
                    component: 
                   (SpecCollection
                      collection: (
                       (VerticalPanelViewSpec
                          name: 'VerticalPanel2_1'
                          layout: (LayoutFrame 20 0 0 0 0 0.5 0 1)
                          horizontalLayout: fit
                          verticalLayout: top
                          horizontalSpace: 3
                          verticalSpace: 0
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'ST/X Extensions'
                                name: 'STXExtensions'
                                enableChannel: warnings
                                model: warnSTXSpecials
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Underscores in Identifiers'
                                name: 'UnderscoresInIdentifiers'
                                enableChannel: enableUnderscore
                                model: warnUnderscoreInIdentifier
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Dollars in Identifiers'
                                name: 'DollarsInIdentifiers'
                                enableChannel: enableDollar
                                model: warnDollarInIdentifier
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'OldStyle Assignment'
                                name: 'OldStyleAssignment'
                                enableChannel: warnings
                                model: warnOldStyleAssignment
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Possible Incompatibilities'
                                name: 'PossibleIncompatibilities'
                                enableChannel: warnings
                                model: warnPossibleIncompatibilities
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Possible STC Compilation Problems'
                                name: 'PossibleSTCCompilationProblems'
                                enableChannel: warnings
                                model: warnAboutPossibleSTCCompilationProblems
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Reference to Private Class'
                                name: 'CheckBox1'
                                enableChannel: warnings
                                model: warnAboutReferenceToPrivateClass
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             (CheckBoxSpec
                                label: 'Possibly Unimplemented Selectors'
                                name: 'CheckBox3'
                                enableChannel: warnings
                                model: warnAboutPossiblyUnimplementedSelectors
                                translateLabel: true
                                extent: (Point 313 22)
                              )
                             )
                           
                          )
                        )
                       (VerticalPanelViewSpec
                          name: 'VerticalPanel2_2'
                          layout: (LayoutFrame -1 0.5 0 0 0 1 0 1)
                          horizontalLayout: left
                          verticalLayout: top
                          horizontalSpace: 3
                          verticalSpace: 0
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Unused Method Variables'
                                name: 'UnusedMethodVariables'
                                enableChannel: warnings
                                model: warnUnusedVars
                                translateLabel: true
                                extent: (Point 600 22)
                              )
                             (CheckBoxSpec
                                label: 'Common Mistakes'
                                name: 'CommonMistakes'
                                enableChannel: warnings
                                model: warnCommonMistakes
                                translateLabel: true
                                extent: (Point 600 22)
                              )
                             (CheckBoxSpec
                                label: 'Bad (non-English) Variable Names'
                                name: 'BadVariableNames'
                                enableChannel: warnings
                                model: warnAboutWrongVariableNames
                                translateLabel: true
                                extent: (Point 600 22)
                              )
                             (CheckBoxSpec
                                label: 'Bad (Non-Lowercase) Local Variable Names'
                                name: 'BadLocalVariableNames'
                                enableChannel: warnings
                                model: warnAboutNonLowercaseLocalVariableNames
                                translateLabel: true
                                extent: (Point 600 22)
                              )
                             (CheckBoxSpec
                                label: 'Bad (Short) Local Variable Names'
                                name: 'CheckBox2'
                                enableChannel: warnings
                                model: warnAboutShortLocalVariableNames
                                translateLabel: true
                                extent: (Point 600 22)
                              )
                             (CheckBoxSpec
                                label: 'Bad (empty) Comments'
                                name: 'BadComments'
                                enableChannel: warnings
                                model: warnAboutBadComments
                                translateLabel: true
                                extent: (Point 600 22)
                              )
                             (CheckBoxSpec
                                label: 'Method-Comment Missing '
                                name: 'CheckBox5'
                                enableChannel: warnings
                                model: warnAboutMissingMethodComment
                                translateLabel: true
                                extent: (Point 600 22)
                              )
                             (CheckBoxSpec
                                label: 'Inconsistent Return Values'
                                name: 'InconsistentReturnValues'
                                enableChannel: warnings
                                model: warnInconsistentReturnValues
                                translateLabel: true
                                extent: (Point 600 22)
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                    extent: (Point 665 181)
                  )
                 (DividerSpec
                    name: 'Separator5'
                    extent: (Point 665 2)
                  )
                 (CheckBoxSpec
                    label: 'Literal Arrays are Immutable'
                    name: 'LiteralArraysAreImmutable'
                    model: arraysAreImmutable
                    translateLabel: true
                    extent: (Point 665 22)
                  )
                 (CheckBoxSpec
                    label: 'Full Debug Info'
                    name: 'FullDebugInfo'
                    model: fullDebugSupport
                    translateLabel: true
                    extent: (Point 665 22)
                  )
                 (DividerSpec
                    name: 'Separator6'
                    extent: (Point 665 2)
                  )
                 (ViewSpec
                    name: 'Box3'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Constant Folding:'
                          name: 'ConstantFoldingLabel'
                          layout: (LayoutFrame 0 0 0 0 306 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (PopUpListSpec
                          label: 'PopUp List'
                          name: 'ConstantFolding'
                          layout: (LayoutFrame 313 0 0 0 -5 1 22 0)
                          tabable: true
                          model: constantFoldingSelection
                          menu: constantFolding
                          useIndex: true
                        )
                       )
                     
                    )
                    extent: (Point 665 22)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::ByteCodeCompilerSettingsAppl methodsFor:'actions'!

basicReadSettings
    self 
        readAspects:(self simpleAspects)
        from:ParserFlags.

    self constantFoldingSelection 
        value:(self class constantFoldingOptions indexOf:Compiler foldConstants ifAbsent:3).

    self supportsJustInTimeCompilation ifTrue:[
        self fullDebugSupport value:(ObjectMemory fullSingleStepSupport ? false)
    ] ifFalse:[
        self fullDebugSupport value:(Compiler lineNumberInfo == #full)
    ].

    self supportsJustInTimeCompilation ifTrue:[
        self justInTimeCompilation value:(ObjectMemory justInTimeCompilation ? false)
    ] ifFalse:[
        self justInTimeCompilation value:false
    ].

    self warnAboutMissingMethodComment value:(UserPreferences current enforceComment).

    "Modified: / 17-07-2010 / 14:48:38 / cg"
!

basicSaveSettings
    self 
        writeAspects:(self simpleAspects)
        to:ParserFlags.

    self fullDebugSupport value ifTrue:[
        Compiler lineNumberInfo:#full.
    ] ifFalse:[
        Compiler lineNumberInfo:true
    ].

    Compiler foldConstants:(self class constantFoldingOptions at:self constantFoldingSelection value).

    self supportsJustInTimeCompilation ifTrue:[
        | justInTime |
        justInTime := self justInTimeCompilation value.
        justInTime ifTrue:[
            Smalltalk allMethodsDo:[:m | m checked:false].
        ].
        ObjectMemory justInTimeCompilation:justInTime.
        ObjectMemory fullSingleStepSupport:self fullDebugSupport value.
    ].

    UserPreferences current enforceComment:(self warnAboutMissingMethodComment value).

    "Modified: / 17-07-2010 / 14:48:57 / cg"
!

simpleAspects
    ^ 
            #( 
                warnings
                warnCommonMistakes
                warnPossibleIncompatibilities
                warnDollarInIdentifier
                warnOldStyleAssignment
                warnSTXSpecials
                warnUnderscoreInIdentifier
                warnUnusedVars
                warnAboutWrongVariableNames
                warnAboutBadComments
                warnInconsistentReturnValues
                warnAboutNonLowercaseLocalVariableNames
                warnAboutShortLocalVariableNames
                warnAboutPossibleSTCCompilationProblems
                warnAboutReferenceToPrivateClass
                warnAboutPossiblyUnimplementedSelectors

                allowDollarInIdentifier
                allowDolphinExtensions
                allowOldStyleAssignment
                allowQualifiedNames
                allowReservedWordsAsSelectors
                allowSqueakExtensions
                allowUnderscoreInIdentifier
                allowVisualAgeESSymbolLiterals
                allowFixedPointLiterals
                allowEmptyStatements
                allowExtendedBinarySelectors

                arraysAreImmutable
            )

    "Created: / 20-11-2006 / 22:37:17 / cg"
!

stcCompilerSettings

    AbstractLauncherApplication::LauncherDialogs stcCompilerSettings
! !

!AbstractSettingsApplication::ByteCodeCompilerSettingsAppl methodsFor:'aspects'!

allowDollarInIdentifier

    allowDollar isNil ifTrue:[
        allowDollar := ParserFlags allowDollarInIdentifier asValue.
        allowDollar onChangeSend:#updateModifiedChannel to:self.
        allowDollar addDependent:self.
    ].
    ^ allowDollar.
!

allowDolphinExtensions

    allowDolphinExtensions isNil ifTrue:[
        allowDolphinExtensions := ParserFlags allowDolphinExtensions asValue.
        allowDolphinExtensions onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ allowDolphinExtensions.
!

allowEmptyStatements

    allowEmptyStatements isNil ifTrue:[
        allowEmptyStatements := ParserFlags allowEmptyStatements asValue.
        allowEmptyStatements onChangeSend:#updateModifiedChannel to:self.
        "/ allowEmptyStatements addDependent:self.
    ].
    ^ allowEmptyStatements.

    "Created: / 20-11-2006 / 22:35:10 / cg"
!

allowExtendedBinarySelectors

    allowExtendedBinarySelectors isNil ifTrue:[
        allowExtendedBinarySelectors := (ParserFlags allowExtendedBinarySelectors ? false) asValue.
        allowExtendedBinarySelectors onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ allowExtendedBinarySelectors.
!

allowFixedPointLiterals

    allowFixedPointLiterals isNil ifTrue:[
        allowFixedPointLiterals := (ParserFlags allowFixedPointLiterals ? false) asValue.
        allowFixedPointLiterals onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ allowFixedPointLiterals.
!

allowOldStyleAssignment

    allowOldStyleAssignment isNil ifTrue:[
        allowOldStyleAssignment := ParserFlags allowOldStyleAssignment asValue.
        allowOldStyleAssignment onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ allowOldStyleAssignment.
!

allowQualifiedNames

    allowQualifiedNames isNil ifTrue:[
        allowQualifiedNames := ParserFlags allowQualifiedNames asValue.
        allowQualifiedNames onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ allowQualifiedNames.
!

allowReservedWordsAsSelectors

    allowReservedWordsAsSelectors isNil ifTrue:[
        allowReservedWordsAsSelectors := ParserFlags allowReservedWordsAsSelectors asValue.
        allowReservedWordsAsSelectors onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ allowReservedWordsAsSelectors.
!

allowSqueakExtensions

    allowSqueakExtensions isNil ifTrue:[
        allowSqueakExtensions := ParserFlags allowSqueakExtensions asValue.
        allowSqueakExtensions onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ allowSqueakExtensions.
!

allowUnderscoreInIdentifier

    allowUnderscore isNil ifTrue:[
        allowUnderscore := ParserFlags allowUnderscoreInIdentifier asValue.
        allowUnderscore onChangeSend:#updateModifiedChannel to:self.
        allowUnderscore addDependent:self.
    ].
    ^ allowUnderscore.
!

allowVisualAgeESSymbolLiterals

    allowVisualAgeESSymbolLiterals isNil ifTrue:[
        allowVisualAgeESSymbolLiterals := ParserFlags allowVisualAgeESSymbolLiterals asValue.
        allowVisualAgeESSymbolLiterals onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ allowVisualAgeESSymbolLiterals.
!

arraysAreImmutable

    immutableArrays isNil ifTrue:[
        immutableArrays := ParserFlags arraysAreImmutable asValue.
        immutableArrays onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ immutableArrays.
!

constantFolding

    constantFolding isNil ifTrue:[
        constantFolding := (resources array:(self class constantFoldingStrings)) asList.
    ].
    ^ constantFolding.
!

constantFoldingOptions

    constantFoldingOptions isNil ifTrue:[
        constantFoldingOptions := self class constantFoldingOptions.
    ].
    ^ constantFoldingOptions.
!

constantFoldingSelection

    constantFoldingSelection isNil ifTrue:[
        | index |
        index := self class constantFoldingOptions indexOf:Compiler foldConstants ifAbsent:3.
        constantFoldingSelection := index asValue.
        constantFoldingSelection onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ constantFoldingSelection.
!

enableDollar

    enableDollar isNil ifTrue:[
        enableDollar := true asValue.
        enableDollar addDependent:self.
    ].
    ^ enableDollar.
!

enableUnderscore
    enableUnderscore isNil ifTrue:[
        enableUnderscore := true asValue.
    ].
    ^ enableUnderscore.
!

fullDebugSupport

    fullDebugSupport isNil ifTrue:[
        self supportsJustInTimeCompilation ifTrue:[
            fullDebugSupport := (ObjectMemory fullSingleStepSupport ? false) asValue.
        ] ifFalse:[ 
            fullDebugSupport := (Compiler lineNumberInfo == #full) asValue.
        ].
        fullDebugSupport onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ fullDebugSupport.
!

justInTimeCompilation

    justInTimeCompilation isNil ifTrue:[
        self supportsJustInTimeCompilation ifTrue:[
            justInTimeCompilation := (ObjectMemory justInTimeCompilation ? false) asValue.
        ] ifFalse:[ 
            justInTimeCompilation := false asValue.
        ].
        justInTimeCompilation onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ justInTimeCompilation.
!

warnAboutBadComments
    warnAboutBadComments isNil ifTrue:[
        warnAboutBadComments := ParserFlags warnAboutBadComments asValue.
        warnAboutBadComments onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnAboutBadComments.
!

warnAboutMissingMethodComment

    warnAboutMissingMethodComment isNil ifTrue:[
        warnAboutMissingMethodComment := UserPreferences current enforceComment asValue.
        warnAboutMissingMethodComment onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnAboutMissingMethodComment.

    "Created: / 17-07-2010 / 14:39:25 / cg"
!

warnAboutNonLowercaseLocalVariableNames
    warnAboutNonLowercaseLocalVariableNames isNil ifTrue:[
        warnAboutNonLowercaseLocalVariableNames := ParserFlags warnAboutNonLowercaseLocalVariableNames asValue.
        warnAboutNonLowercaseLocalVariableNames onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnAboutNonLowercaseLocalVariableNames.

    "Modified: / 22-10-2006 / 02:30:57 / cg"
!

warnAboutPossibleSTCCompilationProblems

    warnAboutPossibleSTCCompilationProblems isNil ifTrue:[
        warnAboutPossibleSTCCompilationProblems := ParserFlags warnAboutPossibleSTCCompilationProblems asValue.
        warnAboutPossibleSTCCompilationProblems onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnAboutPossibleSTCCompilationProblems.

    "Created: / 20-11-2006 / 22:41:07 / cg"
!

warnAboutPossiblyUnimplementedSelectors

    warnAboutPossiblyUnimplementedSelectors isNil ifTrue:[
        warnAboutPossiblyUnimplementedSelectors := ParserFlags warnAboutPossiblyUnimplementedSelectors asValue.
        warnAboutPossiblyUnimplementedSelectors onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnAboutPossiblyUnimplementedSelectors.

    "Created: / 20-11-2006 / 22:41:07 / cg"
!

warnAboutReferenceToPrivateClass
    warnAboutReferenceToPrivateClass isNil ifTrue:[
        warnAboutReferenceToPrivateClass := ParserFlags warnAboutReferenceToPrivateClass asValue.
        warnAboutReferenceToPrivateClass onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnAboutReferenceToPrivateClass.
!

warnAboutShortLocalVariableNames
    warnAboutShortLocalVariableNames isNil ifTrue:[
        warnAboutShortLocalVariableNames := ParserFlags warnAboutShortLocalVariableNames asValue.
        warnAboutShortLocalVariableNames onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnAboutShortLocalVariableNames.
!

warnAboutWrongVariableNames
    warnAboutWrongVariableNames isNil ifTrue:[
        warnAboutWrongVariableNames := ParserFlags warnAboutWrongVariableNames asValue.
        warnAboutWrongVariableNames onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnAboutWrongVariableNames.
!

warnCommonMistakes

    warnCommonMistakes isNil ifTrue:[
        warnCommonMistakes := ParserFlags warnCommonMistakes asValue.
        warnCommonMistakes onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnCommonMistakes.
!

warnDollarInIdentifier

    warnDollar isNil ifTrue:[
        warnDollar := ParserFlags warnDollarInIdentifier asValue.
        warnDollar onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnDollar.
!

warnInconsistentReturnValues
    warnInconsistentReturnValues isNil ifTrue:[
        warnInconsistentReturnValues := ParserFlags warnInconsistentReturnValues asValue.
        warnInconsistentReturnValues onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnInconsistentReturnValues.
!

warnOldStyleAssignment

    warnOldStyle isNil ifTrue:[
        warnOldStyle := ParserFlags warnOldStyleAssignment asValue.
        warnOldStyle onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnOldStyle.
!

warnPossibleIncompatibilities
    "holds true, if possible incompatibilities (with other ST systems)
     are to be warned about"

    warnCompatibility isNil ifTrue:[
        warnCompatibility := ParserFlags warnPossibleIncompatibilities asValue.
        warnCompatibility onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnCompatibility.
!

warnSTXSpecials

    warnSTX isNil ifTrue:[
        warnSTX := ParserFlags warnSTXSpecials asValue.
        warnSTX onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnSTX.
!

warnUnderscoreInIdentifier

    warnUnderscore isNil ifTrue:[
        warnUnderscore := ParserFlags warnUnderscoreInIdentifier asValue.
        warnUnderscore onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnUnderscore.
!

warnUnusedVars

    warnUnusedVars isNil ifTrue:[
        warnUnusedVars := ParserFlags warnUnusedVars asValue.
        warnUnusedVars onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnUnusedVars.
!

warnings

    warnings isNil ifTrue:[
        warnings := ParserFlags warnings asValue.
        warnings addDependent:self.
        warnings changed.
        warnings onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ warnings.
! !

!AbstractSettingsApplication::ByteCodeCompilerSettingsAppl methodsFor:'change & update'!

update:something with:aParameter from:changedObject
    changedObject == self warnings ifTrue:[
        changedObject value ifTrue:[
            self enableUnderscore value:self allowUnderscoreInIdentifier value.
            self enableDollar value:self allowDollarInIdentifier value.
        ] ifFalse:[
            self enableUnderscore value:false.
            self enableDollar value:false.
        ].
        ^ self
    ].
    (changedObject == self allowDollarInIdentifier or:[changedObject == self allowUnderscoreInIdentifier]) ifTrue:[
        self warnings changed.
        ^ self
    ].

    super update:something with:aParameter from:changedObject
! !

!AbstractSettingsApplication::ByteCodeCompilerSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/compilerSettings.html'
! !

!AbstractSettingsApplication::ByteCodeCompilerSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    (self
        hasChangedAspectIn:(self simpleAspects)
        asComparedTo:ParserFlags) ifTrue:[^ true].

    ((self supportsJustInTimeCompilation value ifTrue:[ObjectMemory fullSingleStepSupport ? false] ifFalse:[Compiler lineNumberInfo == #full]) ~= self fullDebugSupport value) ifTrue:[^ true].
    ((Compiler foldConstants) ~= (self class constantFoldingOptions at:self constantFoldingSelection value)) ifTrue:[^ true].
    ((ObjectMemory justInTimeCompilation ? false) ~= self justInTimeCompilation value) ifTrue:[^ true].

    (UserPreferences current enforceComment ~= self warnAboutMissingMethodComment value) ifTrue:[^ true].

    ^ false

    "Modified: / 17-07-2010 / 14:48:07 / cg"
!

supportsJustInTimeCompilation

    ^ ObjectMemory supportsJustInTimeCompilation
! !

!AbstractSettingsApplication::ChangeFileSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::ChangeFileSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
B (JB (JB (JB (JB (JB (JB (JB (HB@ HB@ HB@ HB@ HB@ HB@$JB (JB@ EAPTEAPTEAPTEAPTEAPTIB@@@B  HAP(JB TEAPTEAPTEAPTEBP @@@(H
B@TJAPTEAPTEAPTEAPTEAP$H@@@JB@ EB TEAPTEAPTEAPTEAPTIB@@@B  HAP(JB TEAP(JAPTEAPTEBP @@@(HB@TEAPTEAP(JB (EAPTEAP$H@@@JB@ E
APTEAP(JAPTJB TEAPTIB@@@B  HAPTEAP(JAPTEAP(JAPTEBP @@@(HB@TEAP(JAPTEAPTEB (EAP$H@@(JB@ EAP(JAPTEAPTEAPTJB TIB@@JB  HAPTJ
B (JB (JB (JB (EA@ JB (HB@TEB@ HB@ HB@ HB@ HAPPHB (JB@ EAPTEAPTEAPTEAPTEAPTDB@(JB  HAP(JB TEAPTEAPTEAPTEA@ JB (HB@TEAP(E
APTEAPTEAPTEAPPHB (JB@ EAPTJAPTEAPTEAPTEAPTDB@(JB  HAP(JB TEAPTEAPTEAPTEA@ JB (HB@TEAPTEAPTEAPTEAPTEAPPHB (JB@$DA@PDA@PD
A@PDA@PDA@PDB@(JB (HB@ HB@ HB@ HB@ HB@ HB@ JB @a') ; colorMapFromArray:#[240 160 80 192 80 0 64 0 0 240 208 160 0 0 0 240 240 240 192 192 192 240 128 0 208 208 208 48 48 48 160 160 160]; mask:((Depth1Image new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@_?? _??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0O??0') ; yourself); yourself]
! !

!AbstractSettingsApplication::ChangeFileSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::ChangeFileSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::ChangeFileSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::ChangeFileSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Changes Settings'
          name: 'Changes Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 561 478)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fitSpace
              verticalLayout: topSpace
              horizontalSpace: 5
              verticalSpace: 5
              component: 
             (SpecCollection
                collection: (
                 (FramedBoxSpec
                    label: 'Change File'
                    name: 'FramedBox2'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log compiles in Changefile'
                          name: 'CheckBox1'
                          layout: (LayoutFrame 5 0 5 0 -5 1 27 0)
                          model: updChanges
                          translateLabel: true
                        )
                       (CheckBoxSpec
                          label: 'Log doIts in Changefile'
                          name: 'CheckBox2'
                          layout: (LayoutFrame 5 0 30 0 -5 1 52 0)
                          model: logDoits
                          translateLabel: true
                        )
                       (LabelSpec
                          label: 'Changefile Name:'
                          name: 'ChangefileNameLabel'
                          layout: (LayoutFrame 135 0 55 0 289 0 77 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'ChangeFileNameEntryField'
                          layout: (LayoutFrame 294 0 55 0 -5 1 77 0)
                          model: changeFileName
                          immediateAccept: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 551 112)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::ChangeFileSettingsAppl methodsFor:'actions'!

basicReadSettings
    self changeFileName value:ObjectMemory nameForChanges.
    self logDoits value:Smalltalk logDoits.
    self updChanges value:Class updatingChanges.

    "Modified: / 27-10-2010 / 10:16:48 / cg"
!

basicSaveSettings

    ObjectMemory nameForChanges:(self changeFileName value).
    Smalltalk logDoits:self logDoits value.
    Class updateChanges:self updChanges value.

    "Modified: / 09-02-2011 / 20:32:47 / cg"
! !

!AbstractSettingsApplication::ChangeFileSettingsAppl methodsFor:'aspects'!

changeFileName

    changeFileName isNil ifTrue:[
        changeFileName := ObjectMemory nameForChanges asValue.
        changeFileName onChangeSend:#updateModifiedChannel to:self
    ].
    ^ changeFileName.
!

logDoits

    logDoits isNil ifTrue:[
        logDoits := Smalltalk logDoits asValue.
        logDoits onChangeSend:#updateModifiedChannel to:self
    ].
    ^ logDoits.
!

updChanges

    updChanges isNil ifTrue:[
        updChanges := Class updatingChanges asValue.
        updChanges onChangeSend:#updateModifiedChannel to:self
    ].
    ^ updChanges.
! !

!AbstractSettingsApplication::ChangeFileSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/messageSettings.html'
! !

!AbstractSettingsApplication::ChangeFileSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    self logDoits value ~= Smalltalk logDoits ifTrue:[^ true].
    self updChanges value ~= Class updatingChanges ifTrue:[^ true].
    self changeFileName value ~= ObjectMemory nameForChanges ifTrue:[^ true].
    ^ false

    "Modified: / 27-10-2010 / 10:17:21 / cg"
! !

!AbstractSettingsApplication::CodeGeneratorSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::CodeGeneratorSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
B (JB (JB (JB (JB (JB (JB (JB (HB@ HB@ HB@ HB@ HB@ HB@$JB (JB@ EAPTEAPTEAPTEAPTEAPTIB@@@B  HAP(JB TEAPTEAPTEAPTEBP @@@(H
B@TJAPTEAPTEAPTEAPTEAP$H@@@JB@ EB TEAPTEAPTQAPTEAPTIB@@@B  HAP(JB TEAPTQD!!DEAPTEBP @@@(HB@TEAPTEDQDEDQLQAQDQAP$H@@@JB@ E
APTEDQPUDQTVEQDUEADIB@@@B  HAPTEAPTQE1 YF!!$XE1DEBP @@@(HB@TEAPTEAQDUF ,ZEQDEAP$H@@(JB@ EAPTEAPTQEQ(KF!!TQAPTIB@@JB  HAPTE
APTQE1 YF!!$XE1DEA@ JB (HB@TEAPTQEATQEQXUDQTTDPPHB (JB@ EAPTEAQDQAQDSDPTQDPTDB@(JB  HAP(JB TEAPTQD!!DEAPTEA@ JB (HB@TEAP(E
APTEAQDEAPTEAPPHB (JB@ EAPTJAPTEAPTEAPTEAPTDB@(JB  HAP(JB TEAPTEAPTEAPTEA@ JB (HB@TEAPTEAPTEAPTEAPTEAPPHB (JB@$DA@PDA@PD
A@PDA@PDA@PDB@(JB (HB@ HB@ HB@ HB@ HB@ HB@ JB @a') ; colorMapFromArray:#[240 160 80 192 80 0 64 0 0 240 208 160 0 0 0 240 240 240 192 192 192 240 128 0 208 208 208 48 48 48 160 160 160 255 248 248 207 216 240 240 240 248 239 232 240 48 88 176 224 224 232 240 144 24 255 248 48 255 248 96 255 248 24 240 208 24 255 248 152 255 248 88 255 248 136 255 248 176 255 248 200]; mask:((Depth1Image new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@_?? _??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0O??0') ; yourself); yourself]
! !

!AbstractSettingsApplication::CodeGeneratorSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::CodeGeneratorSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::CodeGeneratorSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::CodeGeneratorSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Tool Settings'
          name: 'Tool Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 607 786)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0 0 1.0 342 0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Generate Comments'
                    name: 'GenerateComments'
                    activeHelpKey: generateComments
                    model: generateComments
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Generate Comments In Getters'
                    name: 'GenerateCommentsInGetters'
                    activeHelpKey: generateCommentsInGetters
                    enableChannel: generateComments
                    model: generateCommentsInGetters
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Generate Comments In Setters'
                    name: 'GenerateCommentsInSetters'
                    activeHelpKey: generateCommentsInSetters
                    enableChannel: generateComments
                    model: generateCommentsInSetters
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::CodeGeneratorSettingsAppl methodsFor:'actions'!

basicReadSettings
    self 
        readAspects:(self aspectSelectors)
        from:currentUserPrefs.
!

basicSaveSettings
    self 
        writeAspects:(self aspectSelectors)
        to:currentUserPrefs.
! !

!AbstractSettingsApplication::CodeGeneratorSettingsAppl methodsFor:'aspects'!

aspectSelectors
    ^ #(
        generateComments
        generateCommentsForGetters
        generateCommentsForSetters
    )
!

generateComments
    generateComments isNil ifTrue:[
        generateComments := UserPreferences current generateComments asValue.
        generateComments onChangeSend:#updateModifiedChannel to:self
    ].
    ^ generateComments.
!

generateCommentsForGetters
    generateCommentsForGetters isNil ifTrue:[
        generateCommentsForGetters := UserPreferences current generateCommentsForGetters asValue.
        generateCommentsForGetters onChangeSend:#updateModifiedChannel to:self
    ].
    ^ generateCommentsForGetters.
!

generateCommentsForSetters
    generateCommentsForSetters isNil ifTrue:[
        generateCommentsForSetters := UserPreferences current generateCommentsForSetters asValue.
        generateCommentsForSetters onChangeSend:#updateModifiedChannel to:self
    ].
    ^ generateCommentsForSetters.
! !

!AbstractSettingsApplication::CodeGeneratorSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/codeGeneratorSettings.html'
! !

!AbstractSettingsApplication::CodeGeneratorSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    (self
        hasChangedAspectIn:(self aspectSelectors)
        asComparedTo:currentUserPrefs) ifTrue:[^ true].
    ^ false.
! !

!AbstractSettingsApplication::CommunicationLoggingSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ self defaultIcon2
!

defaultIcon1
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::CommunicationLoggingSettingsAppl class defaultIcon1'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(8)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@ECP4MCP4MCP4MCP4MCP4@@A @F@@CAPHB@ HB@ HB@ HBB (E@@@X@A @@0TB@ HB@ HB@ HB@ (JAP@@@@@@@@LE
@ 4MCP4MCPHB@ (JB T@@@@@@@@CAPHB@ HB@ HB@ HJB (E@@@@@@@@@0TBCP4MCP4M@ HBB (JAP@@@@@@@@LE@ HB@ HB@ HB@ (JB T@@@@@@@@CAPHM
CP4MCP4B@ (JB (E@@@@@@@@@0TB@ HB@ HB@ HJB (JAP@@@@@@@@LE@ 4MCP4MCPHBB (JB T@@A(XF@@CAPHB@ HB@ HB@ (JB (E@ @@@@@@@0TB@ HB
@ HB@ HJB (JAPH@@A @@@LE@ 4MCP4MCPHBB (JB T@@@@X@@@CAPHB@ HB@ HB@ (JB (E@@@@F@@@@0TBCP4MCP4M@ (JB (JAP@@F!!(X@@LE@ HB@ HB
@ HBB (JB T@@A(XF@@CAPHB@ HB@ HBB (JB (E@@@ZFA @@0TEAPTEAPTEAPTEAPTEAP@@F!! X@@LC@0LC@0LC@0LC@0LC@0@@@A(ZF@@@@@@@@@@@@@@@
@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@a') ; colorMapFromArray:#[0 0 0 32 96 80 240 240 240 192 192 192 64 144 128 80 80 80 48 112 112 48 128 128 32 96 96 48 128 112 224 224 224 32 80 80 64 96 96 0 80 128 128 128 128 16 144 192 16 128 176 16 128 160 0 112 160 0 112 144 0 96 144 16 112 144 0 96 128 0 80 112 100 100 100 127 127 127 255 255 0]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@_?<8??<8??<P??<P??<P??<P??<P??<P??<8??=<???<??>8??<8??<8??=<??=<??=<??=<??9<@@@8@@@@') ; yourself); yourself]
!

defaultIcon2
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon2 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon2
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::CommunicationLoggingSettingsAppl class defaultIcon2'
        ifAbsentPut:[(Depth8Image new) width: 17; height: 22; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@@@@@@@@@@@AP4MCP4MCP4MCP4MCP4M@@LE@ HB@ HB@ HB@ HJB T@@0TB@ HB@ HB@ HB@ (JAP@CAPHMCP4MCP4B@ HJB (E@@LE@ HB
@ HB@ HB@ (JB T@@0TBCP4MCP4M@ HBB (JAP@CAPHB@ HB@ HB@ HJB (E@@LE@ 4MCP4MCPHBB (JB T@@0TB@ HB@ HB@ HJB (JAP@CAPHMCP4MCP4B
@ (JB (E@@LE@ HB@ HB@ HBB (JB T@@0TB@ HB@ HB@ HJB (JAP@CAPHMCP4MCP4B@ (JB (E@@LE@ HB@ HB@ HBB (JB T@@0TBCP4MCP4M@ (JB (J
AP@CAPHB@ HB@ HB@ (JB (E@@LE@ HB@ HB@ HJB (JB T@@0TEAPTEAPTEAPTEAPTEAP@C@0LC@0LC@0LC@0LC@0L@@@@@@@@@@@@@@@@@@@@@@@@@@@@@
@@@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 32 96 80 240 240 240 192 192 192 64 144 128 80 80 80 48 112 112 48 128 128 32 96 96 48 128 112 224 224 224 32 80 80 64 96 96 0 80 128]; mask:((Depth1Image new) width: 17; height: 22; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@_?<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??<@??8@@@@@@@@@') ; yourself); yourself]
! !

!AbstractSettingsApplication::CommunicationLoggingSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::CommunicationLoggingSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::CommunicationLoggingSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::CommunicationLoggingSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Com-Logging settings'
          name: 'Com-Logging settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 445 401)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0 0 0 0 1 0 1)
              horizontalLayout: fitSpace
              verticalLayout: topSpace
              horizontalSpace: 5
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Log Outgoing HTTP Requests on Transcript'
                    name: 'LogHTTPRequests'
                    enableChannel: displaySupportsNativeWidgets
                    model: logHTTPRequests
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (CheckBoxSpec
                    label: 'Log Outgoing SOAP Requests on Transcript'
                    name: 'LogSOAPRequests'
                    enableChannel: displaySupportsNativeDialogs
                    model: logSOAPRequests
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::CommunicationLoggingSettingsAppl methodsFor:'actions'!

aspectsFromUserPreferences
    ^ #(
        logHTTPRequests
        logSOAPRequests
    )
!

basicReadSettings
    self 
        readAspects:(self aspectsFromUserPreferences)
        from:currentUserPrefs.
!

basicSaveSettings
    self 
        writeAspects:(self aspectsFromUserPreferences)
        to:currentUserPrefs.
! !

!AbstractSettingsApplication::CommunicationLoggingSettingsAppl methodsFor:'aspects'!

logHTTPRequests 
    logHTTPRequests isNil ifTrue:[
        logHTTPRequests := false asValue.
        logHTTPRequests onChangeSend:#updateModifiedChannel to:self
    ].
    ^ logHTTPRequests.
!

logSOAPRequests
    logSOAPRequests isNil ifTrue:[
        logSOAPRequests := false asValue.
        logSOAPRequests onChangeSend:#updateModifiedChannel to:self
    ].
    ^ logSOAPRequests.
! !

!AbstractSettingsApplication::CommunicationLoggingSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/comLoggingSettings.html'
! !

!AbstractSettingsApplication::CommunicationLoggingSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
     ^ self
        hasChangedAspectIn:(self aspectsFromUserPreferences)
        asComparedTo:currentUserPrefs
! !

!AbstractSettingsApplication::DebuggerSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary bugReporter24x24Icon    
! !

!AbstractSettingsApplication::DebuggerSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::DebuggerSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::DebuggerSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::DebuggerSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Debugger Settings'
          name: 'Debugger Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 600 320)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 5
              component: 
             (SpecCollection
                collection: (
                 (ViewSpec
                    name: 'ShowErrorNotifierBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Show Error Notifier before Opening Debugger'
                          name: 'ShowErrorNotifierCheckBox'
                          layout: (LayoutFrame 5 0 5 0 -5 1 27 0)
                          model: showErrorNotifier
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 30)
                  )
                 (ViewSpec
                    name: 'ShowVerboseStackBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Verbose Backtrace by Default in Debugger'
                          name: 'ShowVerboseStackCheckBox'
                          layout: (LayoutFrame 5 0 5 0 -5 1 27 0)
                          model: verboseBacktraceInDebugger
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 30)
                  )
                 (ViewSpec
                    name: 'UseNewLayoutInDebuggerBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Use New Layout'
                          name: 'UseNewLayoutInDebuggerCheckBox'
                          layout: (LayoutFrame 5 0 5 0 -5 1 27 0)
                          model: useNewLayoutInDebugger
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 29)
                  )
                 (ViewSpec
                    name: 'AllowSendingMailFromDebuggerBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Allow Sending of Error Reports from Debugger'
                          name: 'AllowSendingMailFromDebuggerCheckBox'
                          layout: (LayoutFrame 5 0 5 0 -5 1 27 0)
                          model: allowSendMailFromDebugger
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 30)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::DebuggerSettingsAppl methodsFor:'actions'!

basicReadSettings
    self showErrorNotifier value:(NoHandlerError emergencyHandler == AbstractLauncherApplication notifyingEmergencyHandler).
    self allowSendMailFromDebugger value:currentUserPrefs allowSendMailFromDebugger.
    self verboseBacktraceInDebugger value:(currentUserPrefs verboseBacktraceInDebugger).
    self useNewLayoutInDebugger value:(currentUserPrefs useNewLayoutInDebugger).
!

basicSaveSettings
    self showErrorNotifier value ifFalse:[
        NoHandlerError emergencyHandler:nil
    ] ifTrue:[
        NoHandlerError emergencyHandler:(AbstractLauncherApplication notifyingEmergencyHandler)
    ].
    currentUserPrefs allowSendMailFromDebugger:(self allowSendMailFromDebugger value).
    currentUserPrefs verboseBacktraceInDebugger:(self verboseBacktraceInDebugger value).
    currentUserPrefs useNewLayoutInDebugger:(self useNewLayoutInDebugger value).

    Debugger newDebugger.
! !

!AbstractSettingsApplication::DebuggerSettingsAppl methodsFor:'aspects'!

allowSendMailFromDebugger

    allowSendMailFromDebugger isNil ifTrue:[
        allowSendMailFromDebugger := currentUserPrefs allowSendMailFromDebugger asValue.
        allowSendMailFromDebugger onChangeSend:#updateModifiedChannel to:self
    ].
    ^ allowSendMailFromDebugger.
!

showErrorNotifier

    showErrorNotifier isNil ifTrue:[
        showErrorNotifier := (NoHandlerError emergencyHandler == AbstractLauncherApplication notifyingEmergencyHandler) asValue.
        showErrorNotifier onChangeSend:#updateModifiedChannel to:self
    ].
    ^ showErrorNotifier.
!

useNewLayoutInDebugger

    useNewLayoutInDebugger isNil ifTrue:[
        useNewLayoutInDebugger := (UserPreferences current useNewLayoutInDebugger) asValue.
        useNewLayoutInDebugger onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useNewLayoutInDebugger.
!

verboseBacktraceInDebugger

    verboseBacktraceInDebugger isNil ifTrue:[
        verboseBacktraceInDebugger := (UserPreferences current verboseBacktraceInDebugger ? false) asValue.
        verboseBacktraceInDebugger onChangeSend:#updateModifiedChannel to:self
    ].
    ^ verboseBacktraceInDebugger.
! !

!AbstractSettingsApplication::DebuggerSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/debuggerSettings.html'
! !

!AbstractSettingsApplication::DebuggerSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    self showErrorNotifier value ~= (NoHandlerError emergencyHandler == AbstractLauncherApplication notifyingEmergencyHandler) ifTrue:[^ true].
    currentUserPrefs verboseBacktraceInDebugger ~= self verboseBacktraceInDebugger value ifTrue:[^ true].
    currentUserPrefs allowSendMailFromDebugger ~= self allowSendMailFromDebugger value ifTrue:[^ true].
    currentUserPrefs useNewLayoutInDebugger ~= self useNewLayoutInDebugger value ifTrue:[^ true].
    ^ false
! !

!AbstractSettingsApplication::DisplaySettingsAppl class methodsFor:'defaults'!

clipEncodingStrings

    ^ #('untranslated' 'iso8859' 'jis' 'jis7' 'shift-JIS' 'EUC' 'big5')
!

clipEncodingSyms

    ^ #(nil #iso8859 #jis #jis7 #sjis #euc #big5)
!

staticGrayOrGrayScaleDitherStrings

    ^ #('threshold' 'ordered dither' 'error diffusion')
!

staticGrayOrGrayScaleDitherSyms

    ^ #(threshold ordered floydSteinberg)
!

trueColorDitherStrings

    ^ #('nearest color' 'error diffusion')
!

trueColorDitherSyms

    ^ #(ordered floydSteinberg)
! !

!AbstractSettingsApplication::DisplaySettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary displayScreenIcon
! !

!AbstractSettingsApplication::DisplaySettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::DisplaySettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::DisplaySettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::DisplaySettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Display Screen Settings'
          name: 'Display Screen Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 600 378)
        )
        component: 
       (SpecCollection
          collection: (
           (LabelSpec
              label: 'Actual Visible Screen Area:'
              name: 'ActualVisibleScreenAreaLabel'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 22 0)
              translateLabel: true
              adjust: left
            )
           (LabelSpec
              label: 'Common Sizes:'
              name: 'CommonSizesLabel'
              layout: (LayoutFrame 0 0 39 0 163 0 61 0)
              translateLabel: true
              adjust: right
            )
           (PopUpListSpec
              label: 'monitor size'
              name: 'MonitorSelectionPopUpList'
              layout: (LayoutFrame 170 0 39 0 -5 1 61 0)
              tabable: true
              model: monitorSelection
              menu: monitorList
              useIndex: true
            )
           (LabelSpec
              label: 'Screen Size:'
              name: 'ScreenSizeLabel'
              layout: (LayoutFrame 0 0 72 0 163 0 94 0)
              translateLabel: true
              adjust: right
            )
           (InputFieldSpec
              name: 'SizeXEntryField'
              layout: (LayoutFrame 170 0 72 0 237 0 94 0)
              model: sizeX
              type: number
              immediateAccept: true
              acceptOnReturn: true
              acceptOnTab: true
              acceptOnLostFocus: true
              acceptOnPointerLeave: true
            )
           (LabelSpec
              label: ' x '
              name: 'xLabel'
              layout: (LayoutFrame 238 0 72 0 271 0 94 0)
              translateLabel: true
            )
           (InputFieldSpec
              name: 'SizeYEntryField'
              layout: (LayoutFrame 272 0 72 0 339 0 94 0)
              model: sizeY
              type: number
              immediateAccept: true
              acceptOnReturn: true
              acceptOnTab: true
              acceptOnLostFocus: true
              acceptOnPointerLeave: true
            )
           (LabelSpec
              label: '(mm)'
              name: 'mmLabel'
              layout: (LayoutFrame 351 0 72 0 397 0 94 0)
              translateLabel: true
              adjust: left
            )
           (DividerSpec
              name: 'Separator1'
              layout: (LayoutFrame 0 0.0 105 0 0 1.0 109 0)
            )
           (LabelSpec
              name: 'ScreenDepthVisualLabel'
              layout: (LayoutFrame 0 0.0 113 0.0 0 1.0 135 0)
              translateLabel: true
              labelChannel: screenDepthVisualLabelHolder
              adjust: left
            )
           (DividerSpec
              name: 'Separator2'
              layout: (LayoutFrame 0 0.0 139 0 0 1.0 143 0)
            )
           (CheckBoxSpec
              label: 'Color Monitor'
              name: 'ColorMonitorCheckBox'
              layout: (LayoutFrame 5 0 150 0 250 0 172 0)
              model: isColorMonitor
              translateLabel: true
            )
           (CheckBoxSpec
              label: 'Use Fix Color Palette'
              name: 'FixColorPaletteCheckBox'
              layout: (LayoutFrame 5 0 175 0 301 0 197 0)
              enableChannel: visualIsPseudoColor
              model: useFixPalette
              translateLabel: true
              labelChannel: useFixPaletteLabel
            )
           (CheckBoxSpec
              label: 'Use Fix Gray Color Palette'
              name: 'UseFixGrayPaletteCheckBox'
              layout: (LayoutFrame 5 0 201 0 301 0 223 0)
              enableChannel: visualIsPseudoColor
              model: useFixGrayPalette
              translateLabel: true
              labelChannel: useFixGrayPaletteLabel
            )
           (LabelSpec
              label: 'Image Display:'
              name: 'ImageDisplayLabel'
              layout: (LayoutFrame 0 0 230 0 255 0 252 0)
              translateLabel: true
              adjust: right
            )
           (PopUpListSpec
              label: 'image display'
              name: 'DitherListPopUpList'
              layout: (LayoutFrame 255 0 230 0 -5 1 252 0)
              tabable: true
              model: ditherListSelection
              enableChannel: ditherSymsNotNil
              menu: ditherList
              useIndex: true
            )
           (CheckBoxSpec
              label: 'Allow Colored/Grayscale Icons'
              name: 'AllowColoredGrayscaleIconsCheckBox'
              layout: (LayoutFrame 5 0 262 0 301 0 284 0)
              model: deepIcons
              translateLabel: true
            )
           (DividerSpec
              name: 'Separator3'
              layout: (LayoutFrame 0 0.0 288 0 0 1.0 292 0)
            )
           (LabelSpec
              label: 'ClipBoard Encoding:'
              name: 'ClipBoardEncodingLabel'
              layout: (LayoutFrame 0 0 303 0 255 0 325 0)
              translateLabel: true
              adjust: right
            )
           (PopUpListSpec
              label: 'image display'
              name: 'ClipEncodingListPopUpList'
              layout: (LayoutFrame 255 0 303 0 -5 1 325 0)
              tabable: true
              model: clipEncodingListSelection
              menu: clipEncodingList
              useIndex: true
            )
           (DividerSpec
              name: 'Separator4'
              layout: (LayoutFrame 0 0.0 360 0 0 1.0 364 0)
            )
           (LabelSpec
              label: 'Max. CopyBuffer Size:'
              name: 'MaxCopyBufferSizeLabel'
              layout: (LayoutFrame 0 0 330 0 255 0 352 0)
              translateLabel: true
              adjust: right
            )
           (InputFieldSpec
              name: 'MaxCopyBufferEntryField'
              layout: (LayoutFrame 255 0 330 0 350 0 352 0)
              model: maxCopyBufferSize
              type: fileSize
              immediateAccept: true
              acceptOnReturn: true
              acceptOnTab: true
              acceptOnLostFocus: true
              acceptOnPointerLeave: true
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::DisplaySettingsAppl methodsFor:'actions'!

basicReadSettings
    self useFixPalette value:screen fixColors notNil.
    self useFixGrayPalette value:screen fixGrayColors notNil.
    self isColorMonitor value:screen hasColors.
    self sizeX value:screen widthInMillimeter.
    self sizeY value:screen heightInMillimeter.
    self deepIcons value:screen supportsDeepIcons.
    ditherSyms notNil ifTrue:[
        self ditherListSelection 
            value:(ditherSyms indexOf:(Image ditherAlgorithm) ifAbsent:#threshold)
    ].
    self clipEncodingListSelection 
        value:(self class clipEncodingSyms indexOf:screen clipboardEncoding
                ifAbsent:1).
!

basicSaveSettings

    Image flushDeviceImages.

    screen visualType == #PseudoColor ifTrue:[
        self useFixPalette value ifTrue:[
            Color colorAllocationFailSignal handle:[:ex |
                self warn:'Could not allocate colors.'.
            ] do:[
                Color getColorsRed:4 green:8 blue:4 on:screen
            ]
        ] ifFalse:[
            screen releaseFixColors
        ].

        self useFixGrayPalette value ifTrue:[
            Color colorAllocationFailSignal handle:[:ex |
                self warn:'Could not allocate colors.'.
            ] do:[
                Color getGrayColors:32 on:screen
            ]
        ] ifFalse:[
            screen releaseFixGrayColors
        ]
    ].
    screen hasColors:self isColorMonitor value.
    screen widthInMillimeter:self sizeX value.
    screen heightInMillimeter:self sizeY value.

    screen supportsDeepIcons:self deepIcons value.
    ditherSyms notNil ifTrue:[
        Image ditherAlgorithm:(ditherSyms at:self ditherListSelection value).
    ].

    WindowGroup activeGroup withWaitCursorDo:[
        View defaultStyle:(View defaultStyle).
    ].

    screen clipboardEncoding:(self class clipEncodingSyms at:self clipEncodingListSelection value).
! !

!AbstractSettingsApplication::DisplaySettingsAppl methodsFor:'aspects'!

clipEncodingList

    clipEncodingList isNil ifTrue:[
        clipEncodingList := (resources array:self class clipEncodingStrings) asValue.
"/ if your app needs to be notified of changes, uncomment one of the lines below:
"/       clipEncodingList addDependent:self.
"/       clipEncodingList onChangeSend:#clipEncodingListChanged to:self.
    ].
    ^ clipEncodingList.
!

clipEncodingListSelection

    clipEncodingListSelection isNil ifTrue:[
        clipEncodingListSelection := (self class clipEncodingSyms indexOf:screen clipboardEncoding ifAbsent:1) asValue.
        clipEncodingListSelection onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ clipEncodingListSelection.
!

deepIcons

    deepIcons isNil ifTrue:[
        deepIcons := screen supportsDeepIcons asValue.
        deepIcons onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ deepIcons.
!

ditherList

    ditherList isNil ifTrue:[
        ditherList := ValueHolder new.
    ].
    ^ ditherList.
!

ditherListSelection

    ditherListSelection isNil ifTrue:[
        ditherSyms notNil ifTrue:[
            ditherListSelection := (ditherSyms indexOf:(Image ditherAlgorithm) ifAbsent:#threshold) asValue.
        ] ifFalse:[
            ditherListSelection := ValueHolder new.
        ].
        ditherListSelection onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ ditherListSelection.
!

ditherSymsNotNil

    ditherSymsNotNil isNil ifTrue:[
        ditherSymsNotNil := ditherSyms notNil asValue.
    ].
    ^ ditherSymsNotNil.
!

isColorMonitor

    isColorMonitor isNil ifTrue:[
        isColorMonitor := screen hasColors asValue.
        isColorMonitor onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ isColorMonitor.
!

maxCopyBufferSize

    maxCopyBufferSize isNil ifTrue:[
        maxCopyBufferSize := (8*1024*1024) asValue.
        maxCopyBufferSize addDependent:self.
        maxCopyBufferSize changed.
        maxCopyBufferSize onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ maxCopyBufferSize.
!

monitorList

    monitorList isNil ifTrue:[
        monitorList := (resources array:(sizeInfos collect:[:entry | entry at:1])) asList.
    ].
    ^ monitorList.
!

monitorSelection

    monitorSelection isNil ifTrue:[
        monitorSelection := ValueHolder new.
        monitorSelection addDependent:self.
        monitorSelection onChangeSend:#updateModifiedChannel to:self.
        monitorSelection changed.
    ].
    ^ monitorSelection.
!

screenDepthVisualLabelHolder

    screenDepthVisualLabelHolder isNil ifTrue:[
        screenDepthVisualLabelHolder := (resources string:'Screen: Depth: %1 Visual: %2  (%3)'
                                 with:screen depth printString
                                 with:screen visualType
                                 with:screen serverVendor) asValue.
    ].
    ^ screenDepthVisualLabelHolder.
!

sizeX

    sizeX isNil ifTrue:[
        sizeX := screen widthInMillimeter asValue.
        sizeX addDependent:self.
        sizeX changed.
        sizeX onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ sizeX.
!

sizeY                              

    sizeY isNil ifTrue:[
        sizeY := screen heightInMillimeter asValue.
        sizeY addDependent:self.
        sizeY changed.
        sizeY onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ sizeY.
!

useFixGrayPalette

    useFixGrayPalette isNil ifTrue:[
        useFixGrayPalette := screen fixGrayColors notNil asValue.
        useFixGrayPalette onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ useFixGrayPalette.
!

useFixGrayPaletteLabel

    useFixGrayPaletteLabel isNil ifTrue:[
        useFixGrayPaletteLabel := (resources string:'Use Fix Gray Color Palette %1' with:'(32)') asValue.
    ].
    ^ useFixGrayPaletteLabel.
!

useFixPalette

    useFixPalette isNil ifTrue:[
        useFixPalette := screen fixColors notNil asValue.
        useFixPalette onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ useFixPalette.
!

useFixPaletteLabel

    useFixPaletteLabel isNil ifTrue:[
        useFixPaletteLabel := (resources string:'Use Fix Color Palette %1' with:'(4x8x4)') asValue.
    ].
    ^ useFixPaletteLabel.
!

visualIsPseudoColor

    visualIsPseudoColor isNil ifTrue:[
        visualIsPseudoColor := (screen visualType == #PseudoColor) asValue.
        visualIsPseudoColor onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ visualIsPseudoColor.
! !

!AbstractSettingsApplication::DisplaySettingsAppl methodsFor:'change & update'!

monitorSelectionChanged

    | sel sizeInfoEntry sizes|

    sel := self monitorSelection value.
    (sel notNil and:[sel ~~ 0]) ifTrue:[
        sizeInfoEntry := sizeInfos at:sel.
        sizes := sizeInfoEntry at:2.
        self sizeX value:(sizes at:1).
        self sizeY value:(sizes at:2).
    ].
!

sizeXorYChanged
    | sizes idx|

    sizes := sizeInfos collect:[:entry | entry at:2].
    idx := sizes findFirst:[:entry |
                                ((entry at:1) = sizeX value)
                                and:[((entry at:2) = sizeY value)]
                           ].
    idx ~~ 0 ifTrue:[
        self monitorSelection value:idx
    ].
!

update:something with:aParameter from:changedObject
    changedObject == self monitorSelection ifTrue:[
        self monitorSelectionChanged.
        ^ self.
    ].
    (changedObject == self sizeX or:[self sizeY]) ifTrue:[
        self sizeXorYChanged.
        ^ self.
    ].

    super update:something with:aParameter from:changedObject
! !

!AbstractSettingsApplication::DisplaySettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/screenSettings.html'
! !

!AbstractSettingsApplication::DisplaySettingsAppl methodsFor:'initialization & release'!

initialize

    | listOfSizes visual|

    screen := Screen current.

    listOfSizes := self class classResources at:'LIST_OF_OFFERED_SCREEN_SIZES' default:#default.
    listOfSizes == #default ifTrue:[
        "/ nothing in resource file; offer at least some.
        sizeInfos := #(
                           ( '11.3'' (235mm x 175mm) LCD'   (235 175)    )
                           ( '17''   (325mm x 245mm)'       (325 245)    )
                           ( '19''   (340mm x 270mm)'       (340 270)    )
                           ( '20''   (350mm x 280mm)'       (350 280)    )
                           ( '21''   (365mm x 285mm)'       (365 285)    )
                       ).
    ] ifFalse:[
        sizeInfos := resources array:listOfSizes.
    ].
    visual := screen visualType.
    (visual == #StaticGray or:[visual == #GrayScale]) ifTrue:[
        ditherStyles := self class staticGrayOrGrayScaleDitherStrings.
        ditherSyms := self class staticGrayOrGrayScaleDitherSyms.
    ] ifFalse:[
        visual ~~ #TrueColor ifTrue:[
            ditherStyles := self class trueColorDitherStrings.
            ditherSyms := self class trueColorDitherSyms.
        ]
    ].
    super initialize.

! !

!AbstractSettingsApplication::DisplaySettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    self useFixPalette value ~= screen fixColors notNil ifTrue:[^ true].
    self useFixGrayPalette value ~= screen fixGrayColors notNil ifTrue:[^ true].
    self isColorMonitor value ~= screen hasColors ifTrue:[^ true].
    self sizeX value ~= screen widthInMillimeter ifTrue:[^ true].
    self sizeY value ~= screen heightInMillimeter ifTrue:[^ true].

    self deepIcons value ~= screen supportsDeepIcons ifTrue:[^ true].
    ditherSyms notNil ifTrue:[
        self ditherListSelection value ~= (ditherSyms indexOf:(Image ditherAlgorithm) ifAbsent:#threshold) ifTrue:[^ true].
    ].
    self clipEncodingListSelection value ~= (self class clipEncodingSyms indexOf:screen clipboardEncoding ifAbsent:1) ifTrue:[^ true].
    ^ false
! !

!AbstractSettingsApplication::EditSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary editorIcon
! !

!AbstractSettingsApplication::EditSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::EditSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::EditSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::EditSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Editor Settings'
          name: 'Editor Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 600 320)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0 0 0 0 1 0 1)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'CTRL-Key to Start TextDrag'
                    name: 'CTRLKeyStTextDragCheckBox'
                    model: startTextDragWithControl
                    translateLabel: true
                    extent: (Point 600 23)
                  )
                 (CheckBoxSpec
                    label: 'Always Paste the Contents when Dropping a File (Do not Ask) '
                    name: 'EnforceContentsDropForFiles'
                    model: enforceContentsDropForFiles
                    translateLabel: true
                    extent: (Point 600 23)
                  )
                 (CheckBoxSpec
                    label: 'SearchBox is Modal'
                    name: 'SearchBoxModalCheckBox'
                    model: searchDialogIsModal
                    translateLabel: true
                    extent: (Point 600 23)
                  )
                 (CheckBoxSpec
                    label: 'Tab Stops in Multiples of 4'
                    name: 'TabStopsMultiples4CheckBox'
                    model: tabsIs4
                    translateLabel: true
                    extent: (Point 600 23)
                  )
                 (CheckBoxSpec
                    label: 'Double Click Select Behavior as in ST80'
                    name: 'DoubleClickSelectBehaviorST80CheckBox'
                    model: st80DoubleClickSelectMode
                    translateLabel: true
                    extent: (Point 600 23)
                  )
                 (CheckBoxSpec
                    label: 'Cursor has ST80 Line-end Behavior'
                    name: 'CursorST80LineEndBehaviorCheckBox'
                    model: st80EditMode
                    translateLabel: true
                    extent: (Point 600 23)
                  )
                 (CheckBoxSpec
                    label: 'Treat Underscore as Letter in Word-Select'
                    name: 'UnderscoreIsLetterCheckBox'
                    model: extendedWordSelectMode
                    translateLabel: true
                    extent: (Point 600 23)
                  )
                 (CheckBoxSpec
                    label: 'Any non-Whitespace in Word-Select'
                    name: 'CheckBox1'
                    model: whitespaceWordSelectMode
                    translateLabel: true
                    extent: (Point 600 23)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::EditSettingsAppl methodsFor:'actions'!

basicReadSettings
    self 
        readAspects:self commonAspects
        from:currentUserPrefs.

    self st80DoubleClickSelectMode value:TextView st80SelectMode.
    self tabsIs4 value:(ListView userDefaultTabPositions = ListView tab4Positions).
    self enforceContentsDropForFiles value:(currentUserPrefs enforcedDropModeForFiles == #text).
!

basicSaveSettings
    self 
        writeAspects:self commonAspects
        to:currentUserPrefs.

    self enforceContentsDropForFiles value ifTrue:[
        currentUserPrefs enforcedDropModeForFiles:#text
    ] ifFalse:[
        currentUserPrefs enforcedDropModeForFiles:nil
    ].

    TextView st80SelectMode:(self st80DoubleClickSelectMode value).
    tabsIs4 value ~~ (ListView userDefaultTabPositions = ListView tab4Positions) ifTrue:[
        ListView userDefaultTabPositions:(self tabsIs4 value 
                                            ifTrue:[ListView tab4Positions] 
                                            ifFalse:[ListView tab8Positions]).
        ListView allSubInstancesDo:[:eachKindOfListView |
            self tabsIs4 value 
                ifTrue:[eachKindOfListView setTab4] 
                ifFalse:[eachKindOfListView setTab8]
        ].
    ].
!

commonAspects
    ^ #( 
         #searchDialogIsModal
         #startTextDragWithControl
         #st80EditMode
         #extendedWordSelectMode
         #whitespaceWordSelectMode 
    )
! !

!AbstractSettingsApplication::EditSettingsAppl methodsFor:'aspects'!

enforceContentsDropForFiles
    enforceContentsDropForFiles isNil ifTrue:[
        enforceContentsDropForFiles := true asValue.
        enforceContentsDropForFiles onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ enforceContentsDropForFiles.
!

extendedWordSelectMode
    extendedWordSelectMode isNil ifTrue:[
        extendedWordSelectMode := true asValue.
        extendedWordSelectMode onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ extendedWordSelectMode.
!

searchDialogIsModal
    searchDialogIsModal isNil ifTrue:[
        searchDialogIsModal := true asValue.
        searchDialogIsModal onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ searchDialogIsModal.
!

st80DoubleClickSelectMode
    st80DoubleClickSelectMode isNil ifTrue:[
        st80DoubleClickSelectMode := true asValue.
        st80DoubleClickSelectMode onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ st80DoubleClickSelectMode.
!

st80EditMode
    st80EditingMode isNil ifTrue:[
        st80EditingMode := true asValue.
        st80EditingMode onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ st80EditingMode.
!

startTextDragWithControl
    startTextDragWithControl isNil ifTrue:[
        startTextDragWithControl := true asValue.
        startTextDragWithControl onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ startTextDragWithControl.
!

tabsIs4
    tabsIs4 isNil ifTrue:[
        tabsIs4 := true asValue.
        tabsIs4 onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ tabsIs4.
!

whitespaceWordSelectMode
    whitespaceWordSelectMode isNil ifTrue:[
        whitespaceWordSelectMode := true asValue.
        whitespaceWordSelectMode onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ whitespaceWordSelectMode.
! !

!AbstractSettingsApplication::EditSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/editSettings.html'
! !

!AbstractSettingsApplication::EditSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    self enforceContentsDropForFiles value ~= (currentUserPrefs enforcedDropModeForFiles == #text) ifTrue:[^ true].
    TextView st80SelectMode ~= (self st80DoubleClickSelectMode value) ifTrue:[^ true].
    tabsIs4 value ~~ (ListView userDefaultTabPositions = ListView tab4Positions) ifTrue:[
        ListView userDefaultTabPositions ~= (self tabsIs4 value 
                                                ifTrue:[ListView tab4Positions] 
                                                ifFalse:[ListView tab8Positions]) ifTrue:[^ true].
    ].

    (self
        hasChangedAspectIn:self commonAspects
        asComparedTo:currentUserPrefs) ifTrue:[^ true].

    ^ false
! !

!AbstractSettingsApplication::FontSettingsAppl class methodsFor:'defaults'!

widgetList

    ^  #(
        'All' 
        'Labels' 
        'Buttons' 
        'Lists' 
        'Menus' 
        'Edited Text'
       )
! !

!AbstractSettingsApplication::FontSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary fontIcon
!

defaultIcon2
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon2 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon2
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::FontSettingsAppl class defaultIcon2'
        ifAbsentPut:[(Depth4Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@@@@@@@@!!X @@@@@@@!!X @@@6H@@@@@@DP6H@@@Y!!H@@@@@QDY"@@@BY"@@@@ADQBY"@@@FX @@@@@DQCX @@@6H@@@@@QEP6H@@@@ @@@@
ADUDP @C@@@@@@@DQSH@@@L @@@@@@QEL @@@2@@@@@@ADT2@@@CH@@@@@@DQSH@@@L @@@@@@QEL @@@2@@@@@@QDT2@@@CH@@@@@QDQSH@@@@ @@@@@DQE
P @@@@@@@@@@@DQ@@@@@@@@@@@@@@D@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 255 255 150 150 150 213 213 213 215 48 48 134 54 54 240 240 240]; mask:((Depth1Image new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@G @OG0@O''<@O7>@O<?@A>? A?? A??@A<?@A<>@A<>@A<>@A=>@C?>@G<>@C<\@@8D@@H@@@@@@@@@@@@@@') ; yourself); yourself]
! !

!AbstractSettingsApplication::FontSettingsAppl class methodsFor:'instance creation'!

fontForEncoding:encodingMatch

    | inst |

    inst := self new.
    inst encodingMatch:encodingMatch.
    self initialize.
    self open.
! !

!AbstractSettingsApplication::FontSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::FontSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::FontSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::FontSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Font Settings'
          name: 'Font Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 512 657)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fitSpace
              verticalLayout: topSpace
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (LabelSpec
                    label: 'Label'
                    name: 'Label3'
                    style: labelFont
                    translateLabel: true
                    labelChannel: infoText
                    resizeForLabel: false
                    adjust: left
                    extent: (Point 506 171)
                  )
                 (ViewSpec
                    name: 'CodeBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Code'
                          name: 'Label1'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 20 0)
                          translateLabel: true
                          adjust: left
                        )
                       (LabelSpec
                          label: 'Text Font'
                          name: 'Label2'
                          layout: (LayoutFrame 105 0 22 0 -5 1 44 0)
                          translateLabel: true
                          labelChannel: textFontLabelHolder
                          adjust: left
                          postBuildCallback: postBuildTextFontLabel:
                        )
                       (ActionButtonSpec
                          label: 'Change...'
                          name: 'Button1'
                          layout: (LayoutFrame 0 0.0 22 0 105 0 44 0)
                          translateLabel: true
                          tabable: true
                          model: changeTextFont
                        )
                       (DividerSpec
                          name: 'Separator11'
                          layout: (LayoutFrame 0 0.0 -3 1 0 1.0 0 1)
                        )
                       )
                     
                    )
                    extent: (Point 506 50)
                  )
                 (ViewSpec
                    name: 'InputFieldsBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Input Fields'
                          name: 'Input Fields'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 20 0)
                          translateLabel: true
                          adjust: left
                        )
                       (LabelSpec
                          label: 'InputFields Font'
                          name: 'InputFieldsFont'
                          layout: (LayoutFrame 105 0 22 0 -5 1 44 0)
                          translateLabel: true
                          labelChannel: inputFieldFontLabelHolder
                          adjust: left
                          postBuildCallback: postBuildInputFieldFontLabel:
                        )
                       (ActionButtonSpec
                          label: 'Change...'
                          name: 'ChangeText'
                          layout: (LayoutFrame 0 0.0 22 0 105 0 44 0)
                          translateLabel: true
                          tabable: true
                          model: changeInputFieldFont
                        )
                       (DividerSpec
                          name: 'Separator10'
                          layout: (LayoutFrame 0 0.0 -3 1 0 1.0 0 1)
                        )
                       )
                     
                    )
                    extent: (Point 506 50)
                  )
                 (ViewSpec
                    name: 'ListsBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Lists'
                          name: 'Lists'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 20 0)
                          translateLabel: true
                          adjust: left
                        )
                       (LabelSpec
                          label: 'Lists Font'
                          name: 'ListsFont'
                          layout: (LayoutFrame 105 0 22 0 -5 1 44 0)
                          translateLabel: true
                          labelChannel: listsFontLabelHolder
                          adjust: left
                          postBuildCallback: postBuildListsFontLabel:
                        )
                       (ActionButtonSpec
                          label: 'Change...'
                          name: 'ChangeLists'
                          layout: (LayoutFrame 0 0.0 22 0 105 0 44 0)
                          translateLabel: true
                          tabable: true
                          model: changeListsFont
                        )
                       (DividerSpec
                          name: 'Separator8'
                          layout: (LayoutFrame 0 0.0 -3 1 0 1.0 0 1)
                        )
                       )
                     
                    )
                    extent: (Point 506 50)
                  )
                 (ViewSpec
                    name: 'MenusBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Menus'
                          name: 'Menus'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 20 0)
                          translateLabel: true
                          adjust: left
                        )
                       (LabelSpec
                          label: 'Menus Font'
                          name: 'MenusFont'
                          layout: (LayoutFrame 105 0 22 0 -5 1 44 0)
                          translateLabel: true
                          labelChannel: menusFontLabelHolder
                          adjust: left
                          postBuildCallback: postBuildMenuesFontLabel:
                        )
                       (ActionButtonSpec
                          label: 'Change...'
                          name: 'ChangeMenus'
                          layout: (LayoutFrame 0 0.0 22 0 105 0 44 0)
                          translateLabel: true
                          tabable: true
                          model: changeMenusFont
                        )
                       (DividerSpec
                          name: 'Separator9'
                          layout: (LayoutFrame 0 0.0 -3 1 0 1.0 0 1)
                        )
                       )
                     
                    )
                    extent: (Point 506 50)
                  )
                 (ViewSpec
                    name: 'LabelsBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Labels'
                          name: 'Labels'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 20 0)
                          translateLabel: true
                          adjust: left
                        )
                       (LabelSpec
                          label: 'Labels'
                          name: 'LabelsFont'
                          layout: (LayoutFrame 105 0 22 0 -5 1 44 0)
                          translateLabel: true
                          labelChannel: labelsFontLabelHolder
                          adjust: left
                          postBuildCallback: postBuildLabelsFontLabel:
                        )
                       (ActionButtonSpec
                          label: 'Change...'
                          name: 'ChangeLabels'
                          layout: (LayoutFrame 0 0.0 22 0 105 0 44 0)
                          translateLabel: true
                          tabable: true
                          model: changeLabelsFont
                        )
                       (DividerSpec
                          name: 'Separator6'
                          layout: (LayoutFrame 0 0.0 -3 1 0 1.0 0 1)
                        )
                       )
                     
                    )
                    extent: (Point 506 50)
                  )
                 (ViewSpec
                    name: 'ButtonsBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Buttons'
                          name: 'Buttons'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 20 0)
                          translateLabel: true
                          adjust: left
                        )
                       (LabelSpec
                          label: 'Buttons Font'
                          name: 'ButtonsFont'
                          layout: (LayoutFrame 105 0 22 0 -5 1 44 0)
                          translateLabel: true
                          labelChannel: buttonsFontLabelHolder
                          adjust: left
                          postBuildCallback: postBuildButtonsFontLabel:
                        )
                       (ActionButtonSpec
                          label: 'Change...'
                          name: 'Change Buttons'
                          layout: (LayoutFrame 0 0.0 22 0 105 0 44 0)
                          translateLabel: true
                          tabable: true
                          model: changeButtonsFont
                        )
                       (DividerSpec
                          name: 'Separator7'
                          layout: (LayoutFrame 0 0.0 -3 1 0 1.0 0 1)
                        )
                       )
                     
                    )
                    extent: (Point 506 50)
                  )
                 (ViewSpec
                    name: 'AllBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'All (Others)'
                          name: 'All'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 20 0)
                          translateLabel: true
                          adjust: left
                        )
                       (LabelSpec
                          label: 'Label'
                          name: 'AllFont'
                          layout: (LayoutFrame 105 0 22 0 -5 1 44 0)
                          translateLabel: true
                          labelChannel: allFontLabelHolder
                          adjust: left
                          postBuildCallback: postBuildAllFontLabel:
                        )
                       (ActionButtonSpec
                          label: 'Change...'
                          name: 'ChangeAll'
                          layout: (LayoutFrame 0 0.0 22 0 105 0 44 0)
                          translateLabel: true
                          tabable: true
                          model: changeAllFont
                        )
                       (DividerSpec
                          name: 'Separator1'
                          layout: (LayoutFrame 0 0.0 -3 1 0 1.0 0 1)
                        )
                       )
                     
                    )
                    extent: (Point 506 50)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::FontSettingsAppl methodsFor:'accessing'!

encodingMatch:aEncodingMatch

    aEncodingMatch notNil ifTrue:[
        filter := [:f | f encoding notNil 
                        and:[aEncodingMatch match:f encoding]].
    ].
! !

!AbstractSettingsApplication::FontSettingsAppl methodsFor:'actions'!

basicReadSettings
"/    View readStyleSheetAndUpdateAllStyleCaches.
    self allOfThem value:View defaultFont.
    self labelDef value:Label defaultFont.
    self buttonDef value:Button defaultFont.
    self listDef value:SelectionInListView defaultFont.
    self menuDef value:MenuView defaultFont.
    self textDef value:TextView defaultFont.
    self inputFieldDef value:EditField defaultFont.
!

basicSaveSettings
    |fn|

    View defaultFont:self allOfThem value.
    Label defaultFont:self labelDef value.

    fn := self buttonDef value.
    Button defaultFont:fn.
    Toggle defaultFont:fn.

    fn := self textDef value.
    TextView withAllSubclasses do:[:cls | cls defaultFont:fn].

    fn := self inputFieldDef value.
    EditField withAllSubclasses do:[:cls | cls defaultFont:fn].

    fn := self listDef value.
    SelectionInListView withAllSubclasses do:[:cls | cls defaultFont:fn].

    fn := self menuDef value.
    ListView defaultFont:fn.
    MenuView defaultFont:fn.
    MenuPanel defaultFont:fn.
    NoteBookView defaultFont:fn.
    PullDownMenu defaultFont:fn.
!

changeAllFont
    |f|

    f := FontPanel 
        fontFromUserInitial:(self allOfThem value) 
                      title:(resources string:'Font for %1' with:'All')
                     filter:filter.
    f notNil ifTrue:[
        self allOfThem value:(f onDevice:allLabel device).
        self labelDef value:(f onDevice:labelLabel device).
        self buttonDef value:(f onDevice:buttonsLabel device).
        self listDef value:(f onDevice:listsLabel device).
        self menuDef value:(f onDevice:menuLabel device).
        self textDef value:(f onDevice:textLabel device).
        self inputFieldDef value:(f onDevice:inputFieldLabel device).
    ]
!

changeButtonsFont

    |f|

    f := FontPanel 
        fontFromUserInitial:(self buttonDef value) 
                      title:(resources string:'Font for %1' with:'All')
                     filter:filter.
    f notNil ifTrue:[
        self buttonDef value:(f onDevice:buttonsLabel device).
    ]
!

changeInputFieldFont
    |f|

    f := FontPanel 
        fontFromUserInitial:(self inputFieldDef value) 
                      title:(resources string:'Font for %1' with:'Input Fields')
                     filter:filter.
    f notNil ifTrue:[
        self inputFieldDef value:(f onDevice:inputFieldLabel device).
    ]
!

changeLabelsFont
    |f |

    f := FontPanel 
        fontFromUserInitial:(self labelDef value) 
                      title:(resources string:'Font for %1' with:'Labels')
                     filter:filter.
    f notNil ifTrue:[
        self labelDef value:(f onDevice:labelLabel device).
    ].
!

changeListsFont
    |f|

    f := FontPanel 
        fontFromUserInitial:(self listDef value) 
                      title:(resources string:'Font for %1' with:'Lists')
                     filter:filter.
    f notNil ifTrue:[
        self listDef value:(f onDevice:listsLabel device).
    ]
!

changeMenusFont
    |f|

    f := FontPanel 
        fontFromUserInitial:(self menuDef value) 
                      title:(resources string:'Font for %1' with:'Menus')
                     filter:filter.
    f notNil ifTrue:[
        self menuDef value:(f onDevice:menuLabel device).
    ]
!

changeTextFont
    |f|

    f := FontPanel 
        fontFromUserInitial:(self textDef value) 
                      title:(resources string:'Font for %1' with:'Edited Text')
                     filter:filter.
    f notNil ifTrue:[
        self textDef value:(f onDevice:textLabel device).
    ]
! !

!AbstractSettingsApplication::FontSettingsAppl methodsFor:'aspects'!

allFontLabelHolder

    allFontLabelHolder isNil ifTrue:[
        allFontLabelHolder := '' asValue.
    ].
    ^ allFontLabelHolder.
!

allOfThem
    "return/create the 'allOfThem' value holder (automatically generated)"

    allOfThem isNil ifTrue:[
        allOfThem := ValueHolder new.
        allOfThem addDependent:self.
    ].
    ^ allOfThem
!

buttonDef
    "return/create the 'buttonDef' value holder (automatically generated)"

    buttonDef isNil ifTrue:[
        buttonDef := ValueHolder new.
        buttonDef addDependent:self.
    ].
    ^ buttonDef
!

buttonsFontLabelHolder

    buttonsFontLabelHolder isNil ifTrue:[
        buttonsFontLabelHolder := '' asValue.
    ].
    ^ buttonsFontLabelHolder.
!

infoText
    ^ self resources 
        string:'FONT_SETTINGS_INFO'
        default:'Please notice that any changes usually only affect new windows.
Existing  windows usually remember their initial font as created.
If required, reopen some of the views.

Also notice: 
    unless you save your new settings, 
    only the current session is affected by changes here.'

    "Created: / 17-08-2010 / 10:52:00 / cg"
!

inputFieldDef
    inputFieldDef isNil ifTrue:[
        inputFieldDef := ValueHolder new.
        inputFieldDef addDependent:self.
    ].
    ^ inputFieldDef
!

inputFieldFontLabelHolder

    inputFieldFontLabelHolder isNil ifTrue:[
        inputFieldFontLabelHolder := '' asValue.
    ].
    ^ inputFieldFontLabelHolder.
!

labelDef
    "return/create the 'labelDef' value holder (automatically generated)"

    labelDef isNil ifTrue:[
        labelDef := ValueHolder new.
        labelDef addDependent:self.
    ].
    ^ labelDef
!

labelsFontLabelHolder

    labelsFontLabelHolder isNil ifTrue:[
        labelsFontLabelHolder := '' asValue.
    ].
    ^ labelsFontLabelHolder.
!

listDef
    "return/create the 'listDef' value holder (automatically generated)"

    listDef isNil ifTrue:[
        listDef := ValueHolder new.
        listDef addDependent:self.
    ].
    ^ listDef
!

listsFontLabelHolder

    listsFontLabelHolder isNil ifTrue:[
        listsFontLabelHolder := '' asValue.
    ].
    ^ listsFontLabelHolder.
!

menuDef
    "return/create the 'menuDef' value holder (automatically generated)"

    menuDef isNil ifTrue:[
        menuDef := ValueHolder new.
        menuDef addDependent:self.
    ].
    ^ menuDef
!

menusFontLabelHolder

    menusFontLabelHolder isNil ifTrue:[
        menusFontLabelHolder := '' asValue.
    ].
    ^ menusFontLabelHolder.
!

textDef
    "return/create the 'textDef' value holder (automatically generated)"

    textDef isNil ifTrue:[
        textDef := ValueHolder new.
        textDef addDependent:self.
    ].
    ^ textDef
!

textFontLabelHolder

    textFontLabelHolder isNil ifTrue:[
        textFontLabelHolder := '' asValue.
    ].
    ^ textFontLabelHolder.
! !

!AbstractSettingsApplication::FontSettingsAppl methodsFor:'change & update'!

update:something with:aParameter from:changedObject
    builder notNil ifTrue:[
        changedObject == self allOfThem ifTrue:[
            self updateFontOfLabel:allLabel andFontNameHolder:(self allFontLabelHolder) from:changedObject.
            ^ self.
        ].
        changedObject == self labelDef ifTrue:[
            self updateFontOfLabel:labelLabel andFontNameHolder:(self labelsFontLabelHolder) from:changedObject.
            ^ self.
        ].
        changedObject == self buttonDef ifTrue:[
            self updateFontOfLabel:buttonsLabel andFontNameHolder:(self buttonsFontLabelHolder) from:changedObject.
            ^ self.
        ].
        changedObject == self listDef ifTrue:[
            self updateFontOfLabel:listsLabel andFontNameHolder:(self listsFontLabelHolder) from:changedObject.
            ^ self.
        ].
        changedObject == self menuDef ifTrue:[
            self updateFontOfLabel:menuLabel andFontNameHolder:(self menusFontLabelHolder) from:changedObject.
            ^ self.
        ].
        changedObject == self textDef ifTrue:[
            self updateFontOfLabel:textLabel andFontNameHolder:(self textFontLabelHolder) from:changedObject.
            ^ self.
        ].
        changedObject == self inputFieldDef ifTrue:[
            self updateFontOfLabel:inputFieldLabel andFontNameHolder:(self inputFieldFontLabelHolder) from:changedObject.
            ^ self.
        ].
    ].
    super update:something with:aParameter from:changedObject
!

updateAllFontLabels
    self update:#value with:nil from:self allOfThem.
    self update:#value with:nil from:self labelDef.
    self update:#value with:nil from:self buttonDef.
    self update:#value with:nil from:self listDef.
    self update:#value with:nil from:self menuDef.
    self update:#value with:nil from:self textDef.
    self update:#value with:nil from:self inputFieldDef.
!

updateFontOfLabel:labelWidget andFontNameHolder:fontNameHolder from:changedObject 
    |f label|

    f := changedObject value.
    labelWidget font:f.
    label := f isNil ifTrue:[
                ''
            ] ifFalse:[
                f userFriendlyName
            ].
    fontNameHolder value:label.
    self updateModifiedChannel
! !

!AbstractSettingsApplication::FontSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/fontSettings.html'
! !

!AbstractSettingsApplication::FontSettingsAppl methodsFor:'initialization & release'!

postBuildAllFontLabel:aWidget

    allLabel := aWidget.
!

postBuildButtonsFontLabel:aWidget

    buttonsLabel := aWidget.
!

postBuildInputFieldFontLabel:aWidget

    inputFieldLabel := aWidget.
!

postBuildLabelsFontLabel:aWidget

    labelLabel := aWidget.
!

postBuildListsFontLabel:aWidget

    listsLabel := aWidget.
!

postBuildMenuesFontLabel:aWidget

    menuLabel := aWidget.
!

postBuildTextFontLabel:aWidget

    textLabel := aWidget.
!

postBuildWith:aBuilder 
"/    self readSettings.
    self updateAllFontLabels.
    super postBuildWith:aBuilder
! !

!AbstractSettingsApplication::FontSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    self labelDef value ~= Label defaultFont ifTrue:[^ true].
    self buttonDef value ~= Button defaultFont ifTrue:[^ true].
    self listDef value ~= SelectionInListView defaultFont ifTrue:[^ true].
    self menuDef value ~= MenuView defaultFont ifTrue:[^ true].
    self textDef value ~= TextView defaultFont ifTrue:[^ true].
    self inputFieldDef value ~= EditField defaultFont ifTrue:[^ true].
    ^ false
! !

!AbstractSettingsApplication::GeneralCompilerSettingsAppl class methodsFor:'defaults'!

keepSourceOptions

    ^ #( keep reference absReference sourceReference discard )
!

keepSourceStrings

    ^ #('Keep as String' 'Reference to Filename' 'Reference to Full Path' 'Append and Ref in `st.src''' 'Discard' )
! !

!AbstractSettingsApplication::GeneralCompilerSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ self defaultIcon3

    "Modified: / 17-09-2007 / 11:35:08 / cg"
!

defaultIcon1
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon1 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon1
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::GeneralCompilerSettingsAppl class defaultIcon1'
        ifAbsentPut:[(Depth2Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#[2]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@C??????@CUUUUUW@CZ****''@CZ****''CCZ****''@CV****WKCV****W@CU***)WJCU***)W@CUZ**%W@CUZ**%WACUV**UW@CUV**UWDCUU*)UWI
CUU*)UWICUUZ%UWJCUUZ%UWACUUVUUW@CUUUUUW@C??????@@@@@@@@B') ; colorMapFromArray:#[0 0 0 255 255 255 255 189 23 127 127 127]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8@@@@') ; yourself); yourself]
!

defaultIcon3
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon3 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon3
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::GeneralCompilerSettingsAppl class defaultIcon3'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PD
A@PDA@PDA@PDA@PDA@PDA@LDA LDA@PDA@PDA@PDA@PDA@PD@0LDA@LDA LDA@LCA@PDA@PDA@PDA@PCA PC@0PEAPPC@0PF@0PDA@PDA@PDA@PC@PTDA@TE
APTDA@TA@0PDA@PDA@PDA@PD@0XEAPTEAPTEAPXCA@PDA@PDA@PDA@PD@0PEAPXAA XEAPPCA@PDA@PDA@PDA@LCA@TEA DC@0DFAPTD@0LDA@PDA@PD@0PD
APTE@PLB@ LAAPTEA@PCA@P@A@PD@0DAAPTEA LB@ LFAPTE@PDCA@P@A@PDA@LCA XEAPPC@0PEAPXF@0LDA@PDA@PDA@PD@0XEAPTDA@TEAPXCA@PDA@PD
A@PDA@PD@0PEAPTEAPTEAPPCA@PDA@PDA@PDA@PCA@TAA TEAPTF@PTD@0PDA@PDA@PDA@PCA DC@0PEAPPC@0DF@0PDA@PDA@PDA@PD@0LDA@LD@PLDA@LC
A@PDA@PDA@PDA@PDA@PDA@LD@PLDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD') ; colorMapFromArray:#[255 189 23 127 127 127 236 233 216 0 0 0 255 255 255 194 194 194 161 161 165]; mask:((Depth1Image new) width: 24; height: 24; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@A @@C0@@33@A?? A?? @??@@??@C??0G??8G??8C??0@??@@??@A?? A?? @33@@C0@@A @@@@@@@@@@@@@') ; yourself); yourself]
! !

!AbstractSettingsApplication::GeneralCompilerSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::GeneralCompilerSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::GeneralCompilerSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::GeneralCompilerSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'General Compiler Settings'
          name: 'General Compiler Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 600 320)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Catch Method Redefinitions'
                    name: 'CatchMethodRedefinitions'
                    model: catchMethodRedefs
                    translateLabel: true
                    extent: (Point 600 25)
                  )
                 (CheckBoxSpec
                    label: 'Catch Class Redefinitions'
                    name: 'CatchClassRedefinitions'
                    model: catchClassRedefs
                    translateLabel: true
                    extent: (Point 600 25)
                  )
                 (DividerSpec
                    name: 'Separator2'
                    extent: (Point 600 3)
                  )
                 (CheckBoxSpec
                    label: 'Keep History Line in Methods'
                    name: 'KeepHistoryLineinMethods'
                    model: historyLines
                    translateLabel: true
                    extent: (Point 600 25)
                  )
                 (CheckBoxSpec
                    label: 'Keep Full Class History'
                    name: 'KeepFullClassHistory'
                    enableChannel: hasHistoryManager
                    model: fullHistoryUpdate
                    translateLabel: true
                    extent: (Point 600 25)
                  )
                 (ViewSpec
                    name: 'Box2'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Username in History:'
                          name: 'Label1'
                          layout: (LayoutFrame 0 0 5 0 200 0 27 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField1'
                          layout: (LayoutFrame 200 0 5 0 347 0 27 0)
                          model: userNameInHistoryHolder
                          immediateAccept: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: false
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: '(leave empty for login-name)'
                          name: 'Label2'
                          layout: (LayoutFrame 354 0 5 0 554 0 27 0)
                          translateLabel: true
                          adjust: left
                        )
                       )
                     
                    )
                    extent: (Point 600 29)
                  )
                 (DividerSpec
                    name: 'Separator3'
                    extent: (Point 600 3)
                  )
                 (ViewSpec
                    name: 'Box1'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'FileIn Source Mode:'
                          name: 'FileInSourceModeLabel'
                          layout: (LayoutFrame 0 0 5 0 200 0 27 0)
                          translateLabel: true
                          adjust: right
                        )
                       (PopUpListSpec
                          label: 'PopUp List'
                          name: 'KeepSourceSelection'
                          layout: (LayoutFrame 200 0 5 0 -5 1 27 0)
                          tabable: true
                          model: keepSourceSelection
                          menu: keepSource
                          useIndex: true
                        )
                       )
                     
                    )
                    extent: (Point 600 30)
                  )
                 (DividerSpec
                    name: 'Separator1'
                    extent: (Point 600 3)
                  )
                 (CheckBoxSpec
                    label: 'If Present, Load Binary Objects when Autoloading'
                    name: 'LoadBinaryObjectsWhenAutoloading'
                    enableChannel: canLoadBinaries
                    model: loadBinaries
                    translateLabel: true
                    extent: (Point 600 25)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::GeneralCompilerSettingsAppl methodsFor:'actions'!

basicReadSettings
    self keepSourceSelection value:(self class keepSourceOptions 
                indexOf:ClassCategoryReader sourceMode
                ifAbsent:1).
    self catchClassRedefs value:(Class catchClassRedefinitions ? false).
    self catchMethodRedefs value:(Class catchMethodRedefinitions ? false).
    self canLoadBinaries value ifTrue:[
        self loadBinaries value:Smalltalk loadBinaries
    ] ifFalse:[
        self loadBinaries value:false
    ].
    self hasHistoryManager ifTrue:[
        self fullHistoryUpdate value:(HistoryManager fullHistoryUpdate ? false)
    ] ifFalse:[
        self fullHistoryUpdate value:false
    ].
    self historyLines value:self hasHistoryManager.
    self userNameInHistoryHolder value:(HistoryManager enforcedUserName).

    "Modified: / 04-08-2010 / 18:34:15 / cg"
!

basicSaveSettings
    |nm|

    ClassCategoryReader sourceMode:(self class keepSourceOptions at:self keepSourceSelection value).
    Class catchClassRedefinitions:self catchClassRedefs value.
    Class catchMethodRedefinitions:self catchMethodRedefs value.
    HistoryManager notNil ifTrue:[
        HistoryManager fullHistoryUpdate:self fullHistoryUpdate value.
        self historyLines value ifTrue:[
            HistoryManager activate
        ] ifFalse:[
            HistoryManager deactivate
        ].
        nm := self userNameInHistoryHolder value withoutSeparators.
        nm isEmpty ifTrue:[ nm := nil ].
        HistoryManager enforcedUserName:nm.
    ].
    Smalltalk loadBinaries:self loadBinaries value.

    "Modified: / 04-08-2010 / 18:33:20 / cg"
! !

!AbstractSettingsApplication::GeneralCompilerSettingsAppl methodsFor:'aspects'!

canLoadBinaries

    canLoadBinaries isNil ifTrue:[
        canLoadBinaries := (ObjectFileLoader notNil and:[ObjectFileLoader canLoadObjectFiles]) asValue.
    ].
    ^ canLoadBinaries.
!

catchClassRedefs

    catchClassRedefs isNil ifTrue:[
        catchClassRedefs := (Class catchClassRedefinitions ? false) asValue.
        catchClassRedefs onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ catchClassRedefs.
!

catchMethodRedefs

    catchMethodRedefs isNil ifTrue:[
        catchMethodRedefs := (Class catchMethodRedefinitions ? false) asValue.
        catchMethodRedefs onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ catchMethodRedefs.
!

fullHistoryUpdate

    fullHistoryUpdate isNil ifTrue:[
        self hasHistoryManager ifTrue:[
            fullHistoryUpdate := (HistoryManager fullHistoryUpdate ? false) asValue.
        ] ifFalse:[
            fullHistoryUpdate := false asValue.
        ].
        fullHistoryUpdate onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ fullHistoryUpdate.
!

hasHistoryManager

    ^ HistoryManager notNil and:[HistoryManager isLoaded and:[HistoryManager isActive]]
!

historyLines                                  

    historyLines isNil ifTrue:[
        historyLines := self hasHistoryManager asValue.
        historyLines onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ historyLines.
!

keepSource

    keepSource isNil ifTrue:[
        keepSource := (resources array:(self class keepSourceStrings)) asList.
    ].
    ^ keepSource.
!

keepSourceSelection

    keepSourceSelection isNil ifTrue:[
        keepSourceSelection := (self class keepSourceOptions indexOf:ClassCategoryReader sourceMode ifAbsent:1) asValue.
        keepSourceSelection onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ keepSourceSelection.
!

loadBinaries

    loadBinaries isNil ifTrue:[
        self canLoadBinaries value ifTrue:[ 
            loadBinaries:=  Smalltalk loadBinaries asValue
        ] ifFalse:[
            loadBinaries:=  false asValue
        ].
        loadBinaries onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ loadBinaries.

    "Modified: / 04-08-2010 / 18:34:56 / cg"
!

userNameInHistoryHolder

    userNameInHistoryHolder isNil ifTrue:[
        userNameInHistoryHolder := '' asValue.
        userNameInHistoryHolder onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ userNameInHistoryHolder.

    "Modified: / 04-08-2010 / 18:37:53 / cg"
! !

!AbstractSettingsApplication::GeneralCompilerSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/compilerSettings.html'
! !

!AbstractSettingsApplication::GeneralCompilerSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    ((HistoryManager fullHistoryUpdate ? false) ~= self fullHistoryUpdate value) ifTrue:[^ true].
    ((ClassCategoryReader sourceMode) ~= (self class keepSourceOptions at:self keepSourceSelection value)) ifTrue:[^ true].
    ((Class catchMethodRedefinitions ? false) ~= self catchMethodRedefs value) ifTrue:[^ true].
    ((Class catchClassRedefinitions ? false) ~= self catchClassRedefs value) ifTrue:[^ true].
    ((Smalltalk loadBinaries ? false) ~= self loadBinaries value) ifTrue:[^ true].
    ((self hasHistoryManager) ~= self historyLines value) ifTrue:[^ true].
    (HistoryManager enforcedUserName ~= self userNameInHistoryHolder value) ifTrue:[^ true].
    ^ false.

    "Modified: / 04-08-2010 / 18:31:55 / cg"
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::HTTPStartServerSettingsApplication class defaultIcon'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(8)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@DB@0PC@0HBAP@@@@@@@@@@@@@@@@TFA0 IB ,KB00E@@@@@@@@@@@@@@4NC1@QD!!LKB08KE@T@@@@@@@@@@@TUE!!\PDA@XFQ(NF10]AP@@@@@@@@DF
BQ8PDA@PDAH_E $HE"@@@@@@@@@BHP$VDA@PB00"H2P$IRX''J@@@@@@@JR(WG!!@PB2,+J2,+J2,+J2,+@@@@@@P,DA@PDB,-K"4-K2</K24(L@@@@@@1L#L3
DQ@+K"8.K"84MR86AS@@@@@@M3 IBP 9J28:N3,<OC4(O T0@@@@@C<*BP$IPB,6O#8>O#8>O#XEL@@@@@@APSHIBQ\+K"8.K"8.KR >AS@@@@@@K!!P2BQ8P
J28.K"8.K" (M T0@@@@@@@-EDHQDB-CP4MCP4MCP4PEL@@@@@@@@B9EQ!!@+KT\:N#(:N"4.AS@@@@@@@@@@K$!!IJ29JK2</K2<-M T0@@@@@@@@@@@@K",.
K2</K2</KSXEL@@@@@@@@@@@@@@+K"<AJB (JB46AS@@@@@@@@@@@@@@J28/@@@@@@@/M T0@@@@@@@@@@@@@B,.R41LSD1LSSXEL@@@@@@@@@@@@@@+K#8(
JB (JCX6AS@@@@@@@@@@@@@@J28AM#XAJCX(M T0@@@@@@@a') ; colorMapFromArray:#[0 0 0 144 144 144 112 144 112 16 96 16 0 80 0 128 128 128 0 144 0 0 112 64 0 224 16 0 240 0 0 64 160 16 16 224 64 64 192 128 144 128 0 160 0 0 208 32 0 0 240 0 32 208 0 112 128 0 0 224 48 48 96 0 128 32 0 96 128 0 80 160 0 16 224 0 208 0 64 112 64 32 128 32 0 96 112 48 48 112 0 96 144 0 192 32 48 48 64 0 192 0 64 112 144 64 96 144 64 192 64 64 160 96 64 128 112 80 96 80 160 160 160 16 32 64 0 48 192 96 96 96 0 160 80 208 208 208 192 192 192 224 224 224 48 48 48 0 16 48 0 64 176 0 176 64 192 176 192 176 192 176 176 176 176 0 0 80 0 144 80 0 32 192 16 16 16 208 192 208 208 144 144 96 192 96 176 160 176 48 48 128 0 112 112 0 0 144 0 144 64 160 160 64 144 144 80 48 112 48 0 0 208 208 208 224 48 48 80 32 32 144 224 208 224 176 176 224 176 176 240 192 176 208]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'C? @G?0@O?8@_?<@??<@??>@???@???@???@???@???@???@???@_??@O??@G??@A??@@??@@??@@??@@??@@??@') ; yourself); yourself]
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::HTTPStartServerSettingsApplication andSelector:#windowSpec
     AbstractSettingsApplication::HTTPStartServerSettingsApplication new openInterface:#windowSpec
     AbstractSettingsApplication::HTTPStartServerSettingsApplication open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'HTTP Server Settings'
          name: 'HTTP Server Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 539 630)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (VerticalPanelViewSpec
                    name: 'VerticalPanel4'
                    horizontalLayout: fit
                    verticalLayout: topSpace
                    horizontalSpace: 3
                    verticalSpace: 3
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Box19'
                          component: 
                         (SpecCollection
                            collection: (
                             (LabelSpec
                                label: 'Label'
                                name: 'Label2'
                                layout: (LayoutFrame 5 0.0 0 0.0 -5 1 0 1.0)
                                translateLabel: true
                                labelChannel: informationLabel
                                resizeForLabel: false
                                adjust: left
                              )
                             )
                           
                          )
                          extent: (Point 539 200)
                        )
                       (ViewSpec
                          name: 'Box18'
                          extent: (Point 539 20)
                        )
                       (ViewSpec
                          name: 'Box17'
                          component: 
                         (SpecCollection
                            collection: (
                             (LabelSpec
                                label: 'Port:'
                                name: 'Label1'
                                layout: (LayoutFrame 3 0 21 0 40 0 43 0)
                                translateLabel: true
                                adjust: right
                              )
                             (InputFieldSpec
                                name: 'EntryField1'
                                layout: (LayoutFrame 40 0 20 0 111 0 42 0)
                                enableChannel: hasHTTPServerClass
                                model: portNumberChannel
                                type: number
                                immediateAccept: true
                                acceptOnReturn: true
                                acceptOnTab: true
                                acceptOnLostFocus: true
                                acceptOnPointerLeave: false
                              )
                             (VerticalPanelViewSpec
                                name: 'VerticalPanel5'
                                layout: (LayoutFrame 136 0 14 0 -12 1 132 0)
                                horizontalLayout: fit
                                verticalLayout: spreadSpace
                                horizontalSpace: 3
                                verticalSpace: 3
                                component: 
                               (SpecCollection
                                  collection: (
                                   (ActionButtonSpec
                                      label: 'Create new HTTP Server'
                                      name: 'Button4'
                                      translateLabel: true
                                      tabable: true
                                      model: createServer
                                      enableChannel: hasHTTPServerClass
                                      useDefaultExtent: true
                                    )
                                   (ActionButtonSpec
                                      label: 'Create new FastCGI Server'
                                      name: 'Button7'
                                      translateLabel: true
                                      tabable: true
                                      model: createFcgiServer
                                      enableChannel: hasFCGIServerClass
                                      useDefaultExtent: true
                                    )
                                   (ActionButtonSpec
                                      label: 'Create Server from Settings File...'
                                      name: 'Button6'
                                      translateLabel: true
                                      tabable: true
                                      model: createServerFromFile
                                      enableChannel: hasHTTPServerClass
                                      useDefaultExtent: true
                                    )
                                   (ActionButtonSpec
                                      label: 'Remove all Servers'
                                      name: 'Button5'
                                      translateLabel: true
                                      tabable: true
                                      model: removeAllServers
                                      enableChannel: hasCreatedServerChannel
                                      useDefaultExtent: true
                                    )
                                   )
                                 
                                )
                              )
                             )
                           
                          )
                          extent: (Point 539 142)
                        )
                       )
                     
                    )
                    extent: (Point 539 620)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication class methodsFor:'servers access'!

addCreatedServer:aServer
    self createdServers add:aServer.
!

createdServers
    CreatedServers isNil ifTrue:[
        CreatedServers := Set new.
    ].
    ^ CreatedServers
!

removeAllCreatedServer
    self createdServers removeAll.
!

removeCreatedServer:aServer
    self createdServers remove:aServer ifAbsent:nil.
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication methodsFor:'actions'!

basicReadSettings
    |serverClass|

    serverClass := self serverClass.
    (serverClass notNil and:[serverClass isLoaded]) ifTrue:[
        self serverClass runningServers 
            removeDependent:self;
            addDependent:self.
    ].
    self createServerSubApplicationsForRunningServers.
    self createdServerChanged.

    "Modified: / 25-01-2007 / 16:41:27 / cg"
!

basicSaveSettings
    "nothing done here"

    ^ self
!

createFcgiServer
    "create a FastCGI server"

    FCGIServer isNil ifTrue:[
        self warn:'The FCGIServer-class is missing - cannot create server.'.
        ^ self.
    ].
    ^ self createServerForClass:FCGIServer.

    "Modified: / 26-11-2006 / 13:12:14 / cg"
!

createServer
    "create a default server - i.e. a HTTP server"

    HTTPServer isNil ifTrue:[
        self warn:'The HTTPServer-class is missing - cannot create server.'.
        ^ self.
    ].
    ^ self createServerForClass:self serverClass.

    "Modified: / 25-01-2007 / 16:41:38 / cg"
!

createServerApplicationFor:aServerInstance
    |settingsApp itemPathName newItem openApps|

    openApps := settingsDialog getAllChildrenAppsForApplication:self childrenClass:HTTPServerSettingsAppl.
    (openApps contains:[:app | app httpServerInstance == aServerInstance]) ifTrue:[
        " already have an Item for this application "
        ^ self 
    ].
    HTTPServerSettingsAppl notNil ifTrue:[
        settingsApp := HTTPServerSettingsAppl basicNew.
        settingsApp settingsDialog:self settingsDialog.
        settingsApp httpServerInstance:aServerInstance.
        settingsApp defaultSettingsApplication:false.
        settingsApp basicInitialize.
        itemPathName := self itemPathName , '/', settingsApp nameInSettingsDialog.
        newItem := self settingsDialog addApplClass:#'HTTPServerSettingsAppl' withName:itemPathName.
        newItem application:settingsApp.
        self createdServerChanged.
        self settingsDialog expandItemForApplication:self.
        settingsApp readSettings.
        settingsApp initialize.
    ].
!

createServerForClass:serverClass

    |newServer port runningServers|

    serverClass isNil ifTrue:[
        self warn:'The server class is missing - cannot create server.'.
        ^ self.
    ].

    self withWaitCursorDo:[
        port := self portNumberChannel value.
        runningServers := serverClass runningServers.
        runningServers notEmpty ifTrue:[
            runningServers do:[:aServer |
                aServer port = port asInteger ifTrue:[
                    Dialog warn:'There is already a server for port ', port asString.
                    ^ self
                ]
            ]
        ].
        runningServers addDependent:self.

        (port = serverClass defaultPort) ifTrue:[
            newServer := serverClass newServerWithDefaultServiceListOn:port.
        ] ifFalse:[
            newServer := serverClass newServerOnPort:port.
        ].
        self class addCreatedServer:newServer.
        self createServerApplicationFor:newServer.
    ]
!

createServerFromFile
    |serverClass newServer fileName runningServers newServerPort answer|

    serverClass := self serverClass.
    fileName := Dialog requestFileName:'Select a Server Settings File'
            default:(serverClass settingsFilename)
            pattern:'*.xml'.

    fileName isEmptyOrNil ifTrue:[ ^ self].
    self withWaitCursorDo:[
        newServer := serverClass serverFromSettingsFile:(fileName asFilename).
        newServer notNil ifTrue:[
            newServerPort := newServer port.
            runningServers := serverClass runningServers.
            runningServers notEmpty ifTrue:[
                [self hasServerForPort:newServerPort] whileTrue:[
                    answer := Dialog 
                        request:('There is already a server for port <1p>. Please select another one' expandMacrosWith:newServerPort) 
                        initialAnswer:self portNumberChannel value printString.  
                    answer isEmptyOrNil ifTrue:[
                        ^ self
                    ].
                    newServerPort := Number readFromString:answer.
                ]
            ].
            newServer port:newServerPort.
            runningServers addDependent:self.
            self class addCreatedServer:newServer.
            self createServerApplicationFor:newServer.
        ].
    ].

    "Modified: / 25-01-2007 / 16:40:57 / cg"
!

createServerSubApplicationsForRunningServers
    |serverToStart serverClass|

    serverClass := self serverClass.

    (serverClass notNil and:[ serverClass isLoaded ]) ifFalse:[
        ^ self 
    ].

    serverToStart := serverClass runningServers asSet.
    serverToStart addAll:self class createdServers.
    serverToStart isEmpty ifTrue:[ 
        ^ self
    ].
    serverToStart := serverToStart asSortedCollection:[:a :b | a port < b port].
    serverToStart do:[:eachServerInstance |
        self createServerApplicationFor:eachServerInstance.
    ]

    "Modified: / 25-01-2007 / 16:40:21 / cg"
!

hasServerForPort:newServerPort
    |serverClass|

    serverClass := self serverClass.
    ^ serverClass notNil
      and:[ serverClass runningServers 
                contains:[:eachServer| eachServer port = newServerPort]].

    "Modified: / 25-01-2007 / 16:39:48 / cg"
!

removeAllServerSubApplications
    settingsDialog removeAllSubApplicationsFor:self
!

removeAllServers
    |serverClass|

    serverClass := self serverClass.
    serverClass isLoaded ifTrue:[
        serverClass terminateAllServers.
    ].
    self class removeAllCreatedServer.
    self removeAllServerSubApplications.
    self createdServerChanged.

    "Modified: / 25-01-2007 / 16:39:10 / cg"
!

setPortOnFreePort
    |serverClass highestUsedPortNr portToUse instances|

    serverClass := self serverClass.
    (serverClass notNil and:[serverClass isLoaded]) ifTrue:[
        instances := serverClass runningServers asSet.
        instances addAll:((settingsDialog getAllChildrenAppsForApplication:self) 
                          collect:[:aApp| aApp httpServerInstance]).
        highestUsedPortNr := instances 
                                inject:(serverClass defaultPort - 1) 
                                into:[:maxSoFar :thisServer | thisServer port max:maxSoFar].

        portToUse := highestUsedPortNr + 1
    ] ifFalse:[
        portToUse := 8080
    ].
    self portNumberChannel value:portToUse.

    "Modified: / 25-01-2007 / 16:38:45 / cg"
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication methodsFor:'aspects'!

hasCreatedServerChannel
    hasCreatedServerChannel isNil ifTrue:[
        hasCreatedServerChannel := true asValue.
    ].
    ^ hasCreatedServerChannel.
!

informationLabel
    ^ resources 
        string:'HTTPSTARTINFO'
        default:
'This dialog enables you to create (possibly multiple) HTTP Server processes. 
(i.e. it is possible to serve multiple ports)

Once created, select the individual server in the left tree, 
configure its services, and finally start it up.'
!

portNumberChannel

    portNumberChannel isNil ifTrue:[
        portNumberChannel := ValueHolder new.
    ].
    ^ portNumberChannel.
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication methodsFor:'change & update'!

createdServerChanged

    self hasCreatedServerChannel value:self hasCreatedServer.
    self setPortOnFreePort.
!

runningServersChanged
    self createServerSubApplicationsForRunningServers.
    self setPortOnFreePort.
!

update:something with:aParameter from:changedObject
    |serverClass|

    serverClass := self serverClass.
    (serverClass isLoaded and:[changedObject == serverClass runningServers]) ifTrue:[
        self runningServersChanged.
        ^ self.
    ].
    super update:something with:aParameter from:changedObject

    "Modified: / 25-01-2007 / 16:38:52 / cg"
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication methodsFor:'help'!

helpFilename
    ^ 'HTTPServer/index.html'
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication methodsFor:'initialization & release'!

release
    |serverClass|

    serverClass := self serverClass.
    (serverClass notNil and:[serverClass isLoaded]) ifTrue:[
        serverClass runningServers removeDependent:self.
    ]

    "Modified: / 25-01-2007 / 16:39:23 / cg"
! !

!AbstractSettingsApplication::HTTPStartServerSettingsApplication methodsFor:'queries'!

hasCreatedServer
    ^ (settingsDialog getAllChildrenAppsForApplication:self childrenClass:HTTPServerSettingsAppl) 
        notEmpty
!

hasFCGIServerClass
    ^ FCGIServer notNil

    "Created: / 25-01-2007 / 17:50:14 / cg"
!

hasHTTPServerClass
    ^ self serverClass notNil

    "Created: / 25-01-2007 / 17:50:03 / cg"
!

hasUnsavedChanges

    ^ false
!

isEnabledInSettingsDialog:aSettingsDialog
    ^ true
"/    ^ self serverClass notNil
"/    or:[ HTTPServer notNil
"/    or:[ FCGIServer notNil ]]

    "Created: / 25-01-2007 / 16:48:18 / cg"
    "Modified: / 25-01-2007 / 17:49:24 / cg"
!

serverClass
    "answer the default class for instanciating servers.
     Note that we may instanciate FCGIServer as well"

    ^ HTTPServer
!

whyDisabledInSettingsDialogInfo
    ^ 'there is no HTTPServer class in the system'

    "Created: / 25-01-2007 / 17:16:46 / cg"
! !

!AbstractSettingsApplication::KbdMappingSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary keyboardMappingIcon
! !

!AbstractSettingsApplication::KbdMappingSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::KbdMappingSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::KbdMappingSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::KbdMappingSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Keyboard Mapping Settings'
          name: 'Keyboard Mapping Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 491 653)
        )
        component: 
       (SpecCollection
          collection: (
           (VariableVerticalPanelSpec
              name: 'VariableVerticalPanel1'
              layout: (LayoutFrame 0 0.0 80 0 0 1.0 0 1.0)
              component: 
             (SpecCollection
                collection: (
                 (VariableHorizontalPanelSpec
                    name: 'VariableHorizontalPanel1'
                    component: 
                   (SpecCollection
                      collection: (
                       (SequenceViewSpec
                          name: 'RawKeyList'
                          model: selectedRawKey
                          hasHorizontalScrollBar: true
                          hasVerticalScrollBar: true
                          useIndex: false
                          sequenceList: rawKeyList
                        )
                       (SequenceViewSpec
                          name: 'FunctionKeyList'
                          model: selectedFunctionKey
                          hasHorizontalScrollBar: true
                          hasVerticalScrollBar: true
                          useIndex: false
                          sequenceList: functionKeyList
                        )
                       )
                     
                    )
                    handles: (Any 0.5 1.0)
                  )
                 (ViewSpec
                    name: 'Box1'
                    component: 
                   (SpecCollection
                      collection: (
                       (TextEditorSpec
                          name: 'MacroText'
                          layout: (LayoutFrame 0 0.0 20 0 0 1.0 0 1.0)
                          model: macroTextHolder
                          hasHorizontalScrollBar: true
                          hasVerticalScrollBar: true
                          isReadOnly: true
                        )
                       (LabelSpec
                          label: 'Macro text (if any):'
                          name: 'MacroTextLabel'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 20 0)
                          translateLabel: true
                          adjust: left
                        )
                       )
                     
                    )
                  )
                 )
               
              )
              handles: (Any 0.5 1.0)
            )
           (LabelSpec
              label: 'NoticeText'
              name: 'Text'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 80 0)
              translateLabel: true
              labelChannel: labelTextHolder
              resizeForLabel: true
              adjust: left
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::KbdMappingSettingsAppl methodsFor:'actions'!

basicReadSettings
    "nothing done here"
!

basicSaveSettings
    "nothing done here"
! !

!AbstractSettingsApplication::KbdMappingSettingsAppl methodsFor:'aspects'!

functionKeyList
    functionKeyList isNil ifTrue:[
        functionKeyList := ValueHolder new.
    ].
    ^ functionKeyList.
!

labelTextHolder
    labelTextHolder isNil ifTrue:[
        labelTextHolder := ValueHolder new.
    ].
    ^ labelTextHolder.
!

macroTextHolder
    macroTextHolder isNil ifTrue:[
        macroTextHolder := ValueHolder new.
    ].
    ^ macroTextHolder.
!

rawKeyList

    rawKeyList isNil ifTrue:[
        rawKeyList := List new.
    ].
    ^ rawKeyList.
!

selectedFunctionKey

    selectedFunctionKey isNil ifTrue:[
        selectedFunctionKey := ValueHolder new.
        selectedFunctionKey addDependent:self.
    ].
    ^ selectedFunctionKey.
!

selectedRawKey

    selectedRawKey isNil ifTrue:[
        selectedRawKey := ValueHolder new.
        selectedRawKey addDependent:self.
    ].
    ^ selectedRawKey.
! !

!AbstractSettingsApplication::KbdMappingSettingsAppl methodsFor:'change & update'!

changeFunctionKeySelection

    |raw|
    raw := self selectedRawKey value.
    self selectedFunctionKey value:(mappings at:raw asSymbol) asString  withoutNotifying:self.

    "Modified: / 11-11-2010 / 06:50:04 / cg"
!

changeMacroText

    |f macro indent|

    f := self selectedFunctionKey value.
    (f startsWith:'Cmd') ifTrue:[
        f := f copyFrom:4
    ].
    macro := currentUserPrefs functionKeySequences 
                at:(f asSymbol) ifAbsent:nil.
    macro notNil ifTrue:[
        macro := macro asStringCollection.
        indent := macro
                     inject:99999 into:[:min :element |
                         |stripped|

                         stripped := element withoutLeadingSeparators.
                         stripped isEmpty ifTrue:[
                             min
                         ] ifFalse:[
                             min min:(element size - stripped size)
                         ]
                     ].
        indent ~~ 0 ifTrue:[
            macro := macro collect:[:line | 
                         line size > indent ifTrue:[
                            line copyFrom:indent+1
                         ] ifFalse:[
                            line
                         ].
                    ]
        ].                        
    ].
    macroTextHolder value:macro.
!

changeRawKeySelection
    |f raw|

    f := self selectedFunctionKey value.
    raw := mappings keyAtValue:f asString.
    raw isNil ifTrue:[
        raw := mappings keyAtValue:f first.
        raw isNil ifTrue:[
            raw := mappings keyAtValue:f asSymbol.
        ]
    ].
    self selectedRawKey value:raw withoutNotifying:self.

    "Modified: / 11-11-2010 / 06:49:56 / cg"
!

update:something with:aParameter from:changedObject
    changedObject == self selectedFunctionKey ifTrue:[
        self changeRawKeySelection.
        self changeMacroText.
        ^ self
    ].
    changedObject == self selectedRawKey ifTrue:[
        self changeFunctionKeySelection.
        ^ self
    ].
    super update:something with:aParameter from:changedObject
! !

!AbstractSettingsApplication::KbdMappingSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/keyboardSetting.html'
! !

!AbstractSettingsApplication::KbdMappingSettingsAppl methodsFor:'initialization & release'!

initialize

    super initialize.
    
    mappings := Screen current keyboardMap.

    rawKeyList := (mappings keys collect:[:key | key asString] as:Array) sort.
    functionKeyList := (mappings values asSet collect:[:key | key asString] as:Array) sort.

    self labelTextHolder value:(resources at:'KEY_MSG2' default:'keyboard mapping:') withCRs.
! !

!AbstractSettingsApplication::KbdMappingSettingsAppl methodsFor:'queries'!

hasUnsavedChanges

    ^ false
! !

!AbstractSettingsApplication::LanguageSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary languagesIcon
! !

!AbstractSettingsApplication::LanguageSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::LanguageSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::LanguageSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::LanguageSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Language Settings'
          name: 'Language Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 571 878)
        )
        component: 
       (SpecCollection
          collection: (
           (LabelSpec
              label: 'Current Language:'
              name: 'Label1'
              layout: (LayoutFrame 0 0 0 0 -233 1 20 0)
              translateLabel: true
              labelChannel: currentLanguageLabel
              adjust: right
            )
           (LabelSpec
              label: 'Label'
              name: 'CurrentLang'
              layout: (LayoutFrame -233 1 0 0 0 1 20 0)
              style: (FontDescription arial bold roman 10 nil)
              translateLabel: true
              labelChannel: currentFlagAndLanguageChannel
              adjust: left
            )
           (TextEditorSpec
              name: 'TextEditor1'
              layout: (LayoutFrame 0 0 24 0 0 1.0 181 0)
              style: (FontDescription helvetica medium roman 10 #'iso10646-1')
              model: noticeLabelHolder
              hasHorizontalScrollBar: true
              hasVerticalScrollBar: true
              miniScrollerHorizontal: true
              autoHideScrollBars: true
              isReadOnly: true
              hasKeyboardFocusInitially: false
              viewClassName: 'TextView'
              postBuildCallback: postBuildHelpLabel:
            )
           (InputFieldSpec
              name: 'EntryField1'
              layout: (LayoutFrame 2 0.0 180 0 -2 1.0 204 0)
              model: languageHolder
              acceptOnReturn: true
              acceptOnTab: true
              acceptOnLostFocus: true
              acceptOnPointerLeave: true
            )
           (SequenceViewSpec
              name: 'List1'
              layout: (LayoutFrame 2 0.0 206 0 -2 1.0 -30 1.0)
              model: languageIndexHolder
              hasHorizontalScrollBar: true
              hasVerticalScrollBar: true
              doubleClickSelector: doubleClick:
              useIndex: true
              sequenceList: languageListHolder
            )
           (HorizontalPanelViewSpec
              name: 'HorizontalPanel1'
              layout: (LayoutFrame 0 0 -30 1 0 1 0 1)
              horizontalLayout: center
              verticalLayout: center
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (ActionButtonSpec
                    label: 'Reread Language Resources'
                    name: 'RereadResourcesButton'
                    translateLabel: true
                    resizeForLabel: true
                    model: rereadResourceFiles
                    useDefaultExtent: true
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::LanguageSettingsAppl methodsFor:'accessing'!

languageList
    "return the value of the instance variable 'languageList' (automatically generated)"

    ^ languageList
! !

!AbstractSettingsApplication::LanguageSettingsAppl methodsFor:'actions'!

basicReadSettings
    self languageIndexHolder value:self currentLanguageIndex.
    self languageHolder value:self currentLanguage.
    self currentFlagAndLanguageChannel value:self currentLanguage.

    "Modified: / 24-08-2010 / 18:52:48 / sr"
!

basicSaveSettings
    |fontPref fontPrefs language oldLanguage languageString territory enc 
     answer matchingFonts l screen switch dialog anyWrong|

    self withWaitCursorDo:[
        languageString := translatedLanguages at:(self languageIndexHolder value).
        language := self languageHolder value asString string.
        (language includes:$-) ifTrue:[
            l := language asCollectionOfSubstringsSeparatedBy:$-.
            language := l at:1.
            territory := l at:2.
            territory isNil ifTrue:[
                territory := language string copyTo:2
            ].
        ].

        "/ check if the new language needs a differently encoded font;
        "/ ask user to switch font and allow cancellation.
        "/ Otherwise, you are left with unreadable menu & button items ...

        oldLanguage := UserPreferences current language.
        Smalltalk language:language asSymbol.
        ResourcePack flushCachedResourcePacks.

        "/ refetch resources ...
        resources := AbstractLauncherApplication classResources.
        fontPrefs := resources at:'PREFERRED_FONT_ENCODINGS' default:nil.
        fontPrefs isNil ifTrue:[
            fontPref := resources at:'PREFERRED_FONT_ENCODING' default:nil.
            fontPref isNil ifTrue:[
                fontPrefs := #(#'iso10646-1')
            ] ifFalse:[
                fontPrefs := #(#'iso10646-1') , (Array with:fontPref).
            ]
        ].

        "/ 'normalize' names of encodings
        fontPrefs := fontPrefs collect:[:each | (CharacterEncoder encoderFor:each asLowercase asSymbol ifAbsent:nil)].       
        fontPrefs := fontPrefs select:[:each | each notNil] thenCollect:[:each | each nameOfEncoding].       
        fontPrefs isEmpty ifTrue:[
            fontPrefs := #(#'iso10464-1')
        ].
        fontPref := fontPrefs first.

        Smalltalk setLanguage:#en.
        ResourcePack flushCachedResourcePacks.
        resources := AbstractLauncherApplication classResources.

        switch := true.
        anyWrong := false.
        (Array
            with:MenuView defaultFont
            "/ with:ListView defaultFont
            with:EditTextView defaultFont
            with:Button defaultFont)
        do:[:fn |
            enc := fn encoding.
            (fontPrefs contains:[:pref | CharacterEncoder isEncoding:pref subSetOf:enc])
            ifFalse:[
                anyWrong := true    
            ].
        ].
        anyWrong ifTrue:[
            "/ look if there is one at all.
            screen := Screen current.
            matchingFonts := screen listOfAvailableFonts 
                                select:[:f | fontPrefs contains:[:pref |
                                                CharacterEncoder 
                                                    isEncoding:pref subSetOf:(f encoding ? 'ascii')]].

            matchingFonts isEmpty ifTrue:[
                "/ flush and try again - just in case, the font path has changed.
                screen flushListOfAvailableFonts.
                matchingFonts := screen listOfAvailableFonts 
                                    select:[:f | fontPrefs contains:[:pref |
                                                    CharacterEncoder 
                                                        isEncoding:pref subSetOf:(f encoding ? 'ascii')]].
            ].
            matchingFonts isEmpty ifTrue:[
                (Dialog 
                    confirm:(resources 
                                string:'Your display does not seem to offer any appropriate font.\\Change the language anyway ?\ (Texts will probably be unreadable then)'
                                  with:fontPref) withCRs)
                ifFalse:[
                    switch := false
                ]
            ] ifFalse:[
                answer := Dialog 
                            confirmWithCancel:(resources 
                                                    string:'Some font(s) is not %1-encoded.\\Change it ?'
                                                    with:fontPref) withCRs
                                       labels:(resources
                                                    array:#('Cancel' 'No' 'Yes'))
                                       default:3.
                answer isNil ifTrue:[
                    switch := false
                ] ifFalse:[
                    answer ifTrue:[
                        switch := (AbstractLauncherApplication::LauncherDialogs fontBoxForEncoding:fontPref)
                    ]
                ].
            ].
        ].

        switch ifTrue:[
            Transcript showCR:'Changing language setting to ' , languageString string , ' (' , language , ')...'.
            Smalltalk language:language asSymbol territory:(territory ? language) asSymbol.
            ResourcePack flushCachedResourcePacks.
            "/ ResourcePack flushCachedResourcePacks - already done by language-change
        ].
    ].
    switch ifTrue:[       
        (dialog := settingsDialog) notNil ifTrue:[
            dialog reopenLauncher.
        ] ifFalse:[
            NewLauncher current reopenLauncher.
        ].
        DebugView newDebugger.
    ].
    self updateForChangedLanguage.

    "Modified: / 19-10-2006 / 22:17:44 / cg"
!

doubleClick:aEntry
    self saveSettingsIfUnsavedChangesArePresent.
!

rereadResourceFiles
    ResourcePack flushCachedResourcePacks.
    perLanguageResources := nil.
    self withWaitCursorDo:[
        self updateForChangedLanguage.
    ].

"/    Smalltalk language:(Smalltalk language).
"/    Smalltalk languageTerritory:(Smalltalk languageTerritory).

    Smalltalk changed:#Language.
    Smalltalk changed:#LanguageTerritory.
!

updateForChangedLanguage
    self initializeLanguages.
    languageListHolder value:languageList.
    self languageListHolder value:languageList.
    self currentFlagAndLanguageChannel value:self currentLanguage.
    self setCurrentLanguageLabel.
    self setNoticeLabel.
! !

!AbstractSettingsApplication::LanguageSettingsAppl methodsFor:'aspects'!

currentFlagAndLanguageChannel
    currentFlagAndLanguageChannel isNil ifTrue:[
        currentFlagAndLanguageChannel := self currentLanguage asValue.
    ].
    ^ currentFlagAndLanguageChannel.
!

currentLanguageLabel
    currentLanguageLabel isNil ifTrue:[
        currentLanguageLabel := ValueHolder new.
        self setCurrentLanguageLabel.
    ].
    ^ currentLanguageLabel.
!

languageHolder
    languageHolder isNil ifTrue:[
        languageHolder := self currentLanguage asValue.
        languageHolder onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ languageHolder.
!

languageIndexChanged
    |langIdx|

    langIdx := self languageIndexHolder value ? 1.
    self languageHolder value:(listOfLanguages at:langIdx).
    self updateModifiedChannel.
!

languageIndexHolder
    languageIndexHolder isNil ifTrue:[
        languageIndexHolder := (self currentLanguageIndex) asValue.
        languageIndexHolder onChangeSend:#languageIndexChanged to:self.
    ].
    ^ languageIndexHolder.
!

languageListHolder
    languageListHolder isNil ifTrue:[
        languageListHolder := self languageList asValue.
    ].
    ^ languageListHolder.
!

noticeLabelHolder
    noticeLabelHolder isNil ifTrue:[
        noticeLabelHolder := ValueHolder new.
        self setNoticeLabel.
    ].
    ^ noticeLabelHolder.
!

setCurrentLanguageLabel
    currentLanguageLabel value: (resources string:'Current Language:')
!

setNoticeLabel
    noticeLabelHolder 
        value: ((resources at:'LANG_MSG' default:'Select a Language') withCRs).
! !

!AbstractSettingsApplication::LanguageSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/languageSetting.html'
! !

!AbstractSettingsApplication::LanguageSettingsAppl methodsFor:'initialization & release'!

initialize
    self initializeLanguages.
    super initialize.
!

initializeLanguages
    |flags enResources savedLanguage savedLanguageTerritory enLanguages nativeLanguages languages listOfLanguageKeys|

    resources := self class classResources.
    listOfLanguages := resources at:'LIST_OF_OFFERED_LANGUAGES' default:#('default' 'en' ).
    listOfLanguages := listOfLanguages asOrderedCollection.
    listOfLanguageKeys := listOfLanguages collect:[:l | l copyReplaceAll:$- with:$_ ].

    (perLanguageResources notNil 
    and:[ (perLanguageResources includesKey:#en) not 
    and:[ (perLanguageResources includesKey:#'en_us') not ]]) 
    ifTrue:[
        perLanguageResources := nil.
    ].

    perLanguageResources isNil ifTrue:[
        perLanguageResources := Dictionary new.

        listOfLanguageKeys do:[:eachLang |
            savedLanguage := Language.
            savedLanguageTerritory := LanguageTerritory.
            ResourcePack flushCachedResourcePacks.
            [
                |rsc lang terr|

                lang := terr := eachLang.
                (lang includes:$_) ifTrue:[
                    terr := lang copyFrom:4.
                    lang := lang copyTo:2.
                ].                
                Language := lang asSymbol.
                LanguageTerritory := terr asSymbol.
                rsc := ResourcePack for:(self class) cached:false.
                perLanguageResources at:eachLang asSymbol put:rsc.
            ] ensure:[
                Language := savedLanguage.
                LanguageTerritory := savedLanguageTerritory.
            ].
        ].
        ResourcePack flushCachedResourcePacks.
    ].

    enResources := perLanguageResources at:#en ifAbsent:[perLanguageResources at:#'en_us'].

    enLanguages := listOfLanguageKeys 
                                collect:[:lang | |item|
                                        item := enResources at:('LANG_' , lang) default:nil.
                                        item isNil ifTrue:[
                                            lang
                                        ] ifFalse:[
                                            item isString ifTrue:[
                                                item
                                            ] ifFalse:[
                                                item at:1
                                            ]
                                        ]
                                ].

    nativeLanguages := listOfLanguageKeys 
                                collect:[:lang | |item enLang|
                                        item := enResources at:('LANG_' , lang) default:nil.
                                        item isNil ifTrue:[ 
                                            enLang := lang
                                        ] ifFalse:[
                                            item isString ifTrue:[
                                                enLang := item
                                            ] ifFalse:[
                                                enLang := item at:1
                                            ]
                                        ].
                                        item := (perLanguageResources at:lang asSymbol ifAbsent:enResources) at:enLang default:enLang.
                                ].

    languages := enLanguages 
                                collect:[:enLang | |item|
                                        item := resources at:enLang default:enLang.
                                ].

    flags := listOfLanguageKeys collect:[:lang | |item coll|
                                        item := resources at:('FLAG_' , lang) default:nil.
                                        item notNil ifTrue:[
                                            item
                                        ] ifFalse:[
                                            coll := lang asCollectionOfSubstringsSeparatedBy:$_.
                                            (coll size > 1
                                            and:[(item := resources at:('FLAG_' , coll last) default:nil) notNil])
                                            ifTrue:[
                                                item
                                            ] ifFalse:[
                                                item := resources string:('LANG_' , lang).
                                                item isArray ifTrue:[
                                                    item at:2
                                                ] ifFalse:[
                                                    nil
                                                ]
                                            ]
                                        ]
                                ].
    flags := flags collect:[:nm | |img d| nm notNil ifTrue:[
                                            img := Image fromFile:nm.
                                            img isNil ifTrue:[
                                                d := Smalltalk getPackageDirectoryForPackage:'stx:goodies'.
                                                img := Image fromFile:(d construct:nm).
                                            ].
                                        ] ifFalse:[
                                            nil
                                        ]
                           ].

    
    translatedLanguages := (1 to:languages size) collect:[:idx |
                                |l eL nL s|

                                l := languages at:idx.
                                eL := enLanguages at:idx.
                                nL := nativeLanguages at:idx.

                                s := nL.
                                eL ~= nL ifTrue:[
                                    s := s , ' / ' , eL
                                ].
                                (l ~= nL and:[l ~= eL]) ifTrue:[
                                    s := s , ' / ' , l
                                ].
                                s   
                            ].

    languageList := translatedLanguages 
                        with:flags 
                        collect:[:lang :flag | LabelAndIcon icon:flag string:lang.].

    "Modified: / 18-09-2006 / 19:23:39 / cg"
!

postBuildHelpLabel:aWidget
    aWidget level:0.
    aWidget scrolledView backgroundColor:self window viewBackground.
! !

!AbstractSettingsApplication::LanguageSettingsAppl methodsFor:'queries'!

currentLanguage
    ^ languageList at:(self currentLanguageIndex)
!

currentLanguageCode
    ^ listOfLanguages at:(self currentLanguageIndex)
!

currentLanguageIndex
    | langIdx |

    (Language ~= LanguageTerritory) ifTrue:[
        langIdx := listOfLanguages indexOf:(Language , '-' , LanguageTerritory) ifAbsent:nil.
    ].
    langIdx isNil ifTrue:[
        langIdx := listOfLanguages indexOf:Language ifAbsent:nil.
    ].
    langIdx isNil ifTrue:[
        langIdx := listOfLanguages indexOf:'en' ifAbsent:nil.
        langIdx isNil ifTrue:[
            langIdx := listOfLanguages indexOf:'en-us' ifAbsent:nil.
    
            langIdx isNil ifTrue:[
                langIdx := 1.
            ]
        ]
    ].
    ^ langIdx
!

hasUnsavedChanges
    ^ languageIndexHolder value ~= self currentLanguageIndex

    "Modified: / 17-10-2006 / 17:51:09 / cg"
    "Modified: / 24-08-2010 / 18:50:11 / sr"
! !

!AbstractSettingsApplication::MemorySettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary memoryIcon
! !

!AbstractSettingsApplication::MemorySettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::MemorySettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::MemorySettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::MemorySettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Memory Manager Settings'
          name: 'Memory Manager Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 705 722)
        )
        component: 
       (SpecCollection
          collection: (
           (LabelSpec
              label: 'Label'
              name: 'Label1'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 50 0)
              translateLabel: true
              labelChannel: warningLabelHolder
              adjust: left
            )
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0.0 50 0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 0
              verticalSpace: 3
              ignoreInvisibleComponents: true
              component: 
             (SpecCollection
                collection: (
                 (ViewSpec
                    name: 'NewSpaceSizeBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField23'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: newSpaceSize
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Size of NewSpace:'
                          name: 'Label44'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Size of Space where new objects are created)'
                          name: 'Label45'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator24'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'MaximumMemoryLimitBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField24'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: maxOldSpace
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Maximum Memory Limit:'
                          name: 'Label46'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Never allocate more than this amount of memory)'
                          name: 'Label47'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator25'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'QuickAllocationLimitBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField14'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: fastMoreLimit
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Quick Allocation Limit:'
                          name: 'Label26'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Quickly allocate more memory (suppress GC) up to this limit)'
                          name: 'Label27'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator15'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'IncrementalGCAllocationTriggerBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField25'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: igcLimit
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Incremental GC Allocation Trigger:'
                          name: 'Label48'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Start IGC whenever this amount has been allocated)'
                          name: 'Label49'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator26'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'IncrementalGCFreespaceTriggerBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField26'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: igcFreeLimit
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Incremental GC Freespace Trigger:'
                          name: 'Label50'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Start IGC whenever freespace drops below this)'
                          name: 'Label51'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator27'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'GCAmountBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField17'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: igcFreeAmount
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Incremental GC Amount:'
                          name: 'Label32'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Try to keep this amount for peak requests)'
                          name: 'Label33'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator18'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'OldspaceIncrementBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField18'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: oldIncr
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Oldspace Increment:'
                          name: 'Label34'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Increase oldSpace in chunks of this size)'
                          name: 'Label35'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator19'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'OldSpaceCompressLimitBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField19'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: compressLimit
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Oldspace Compress Limit:'
                          name: 'Label36'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Use 2-pass compressing GC if > 0 and more memory is in use)'
                          name: 'Label37'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator20'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'StackLimitBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField20'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          enableChannel: supportsJustInTimeCompilation
                          model: stackLimit
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Stack Limit:'
                          name: 'Label38'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Trigger recursionInterrupt if more stack is used by a process)'
                          name: 'Label39'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator21'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'CodeLimitBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField21'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          enableChannel: supportsJustInTimeCompilation
                          model: codeLimit
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Dynamic code Limit:'
                          name: 'Label40'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Flush dynamic compiled code to stay within this limit)'
                          name: 'Label41'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator22'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'Box1'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField27'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          enableChannel: supportsJustInTimeCompilation
                          model: methodCodeSizeLimit
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Method Code Size Limit:'
                          name: 'Label52'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Do not JIT, if an individual method''s code size exceeds this)'
                          name: 'Label53'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator28'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 (ViewSpec
                    name: 'CodeTriggerBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (InputFieldSpec
                          name: 'EntryField22'
                          layout: (LayoutFrame 270 0 3 0 360 0 23 0)
                          model: codeTrigger
                          type: fileSize
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Dynamic code Limit:'
                          name: 'Label42'
                          layout: (LayoutFrame 0 0 3 0 265 0 23 0)
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(Start incremental GC whenever this amount of code has been allocated)'
                          name: 'Label43'
                          layout: (LayoutFrame 364 0.0 3 0 0 1.0 23 0)
                          translateLabel: true
                          adjust: left
                        )
                       (DividerSpec
                          name: 'Separator23'
                          layout: (LayoutFrame 0 0.0 0 0 0 1.0 3 0)
                        )
                       )
                     
                    )
                    extent: (Point 705 30)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::MemorySettingsAppl methodsFor:'actions'!

basicReadSettings
    self 
        readAspects:
            #( 
                newSpaceSize
                maxOldSpace
            )
        from:ObjectMemory.

    self igcLimit value:ObjectMemory incrementalGCLimit.
    self igcFreeLimit value:ObjectMemory freeSpaceGCLimit.
    self igcFreeAmount value:ObjectMemory freeSpaceGCAmount.
    self oldIncr value:ObjectMemory oldSpaceIncrement.
    self compressLimit value:ObjectMemory oldSpaceCompressLimit.
    self codeLimit value:ObjectMemory dynamicCodeLimit.
    self codeTrigger value:ObjectMemory dynamicCodeGCTrigger.
    self methodCodeSizeLimit value:(ObjectMemory codeSizeLimitForDynamicCompilation:-1).
    self fastMoreLimit value:(ObjectMemory fastMoreOldSpaceLimit:-1).

    self stackLimit value:Process defaultMaximumStackSize.

    "Modified: / 12-08-2010 / 15:34:24 / cg"
!

basicSaveSettings
    self 
        writeAspects:
            #(
                newSpaceSize
                maxOldSpace
            )
        to:ObjectMemory.

    ObjectMemory freeSpaceGCAmount:self igcFreeAmount value.
    ObjectMemory freeSpaceGCLimit:self igcFreeLimit value.
    ObjectMemory incrementalGCLimit:self igcLimit value.
    ObjectMemory oldSpaceIncrement:self oldIncr value.
    ObjectMemory fastMoreOldSpaceLimit:self fastMoreLimit value.
    ObjectMemory oldSpaceCompressLimit:self compressLimit value.
    ObjectMemory dynamicCodeLimit:self codeLimit value.
    ObjectMemory dynamicCodeGCTrigger:self codeTrigger value.
    ObjectMemory codeSizeLimitForDynamicCompilation:(self methodCodeSizeLimit value).

    Process defaultMaximumStackSize:self stackLimit value.

    "Modified: / 12-08-2010 / 15:34:47 / cg"
! !

!AbstractSettingsApplication::MemorySettingsAppl methodsFor:'aspects'!

codeLimit

    codeLimit isNil ifTrue:[
        codeLimit := ObjectMemory dynamicCodeLimit asValue.
        codeLimit onChangeSend:#updateModifiedChannel to:self
    ].
    ^ codeLimit.
!

codeTrigger

    codeTrigger isNil ifTrue:[
        codeTrigger := ObjectMemory dynamicCodeGCTrigger asValue.
        codeTrigger onChangeSend:#updateModifiedChannel to:self
    ].
    ^ codeTrigger.
!

compressLimit

    compressLimit isNil ifTrue:[
        compressLimit := ObjectMemory oldSpaceCompressLimit asValue.
        compressLimit onChangeSend:#updateModifiedChannel to:self
    ].
    ^ compressLimit.
!

fastMoreLimit

    fastMoreLimit isNil ifTrue:[
        fastMoreLimit := (ObjectMemory fastMoreOldSpaceLimit:-1) asValue.
        fastMoreLimit onChangeSend:#updateModifiedChannel to:self
    ].
    ^ fastMoreLimit.
!

igcFreeAmount

    igcFreeAmount isNil ifTrue:[
        igcFreeAmount := ObjectMemory freeSpaceGCAmount asValue.
        igcFreeAmount onChangeSend:#updateModifiedChannel to:self
    ].
    ^ igcFreeAmount.
!

igcFreeLimit

    igcFreeLimit isNil ifTrue:[
        igcFreeLimit := ObjectMemory freeSpaceGCLimit asValue.
        igcFreeLimit onChangeSend:#updateModifiedChannel to:self
    ].
    ^ igcFreeLimit.
!

igcLimit

    igcLimit isNil ifTrue:[
        igcLimit := ObjectMemory incrementalGCLimit asValue.
        igcLimit onChangeSend:#updateModifiedChannel to:self
    ].
    ^ igcLimit.
!

maxOldSpace

    maxOldSpace isNil ifTrue:[
        maxOldSpace := ObjectMemory maxOldSpace asValue.
        maxOldSpace onChangeSend:#updateModifiedChannel to:self
    ].
    ^ maxOldSpace.
!

methodCodeSizeLimit

    methodCodeSizeLimit isNil ifTrue:[
        methodCodeSizeLimit := (ObjectMemory codeSizeLimitForDynamicCompilation:-1) asValue.
        methodCodeSizeLimit onChangeSend:#updateModifiedChannel to:self
    ].
    ^ methodCodeSizeLimit.

    "Created: / 12-08-2010 / 15:31:56 / cg"
!

newSpaceSize

    newSpaceSize isNil ifTrue:[
        newSpaceSize := ObjectMemory newSpaceSize asValue.
        newSpaceSize onChangeSend:#updateModifiedChannel to:self
    ].
    ^ newSpaceSize.
!

oldIncr

    oldIncr isNil ifTrue:[
        oldIncr := ObjectMemory oldSpaceIncrement asValue.
        oldIncr onChangeSend:#updateModifiedChannel to:self
    ].
    ^ oldIncr.
!

stackLimit

    stackLimit isNil ifTrue:[
        stackLimit := Process defaultMaximumStackSize asValue.
        stackLimit onChangeSend:#updateModifiedChannel to:self
    ].
    ^ stackLimit.
!

supportsJustInTimeCompilation

    ^ ObjectMemory supportsJustInTimeCompilation.
!

warningLabelHolder

    warningLabelHolder isNil ifTrue:[
        warningLabelHolder := ValueHolder new.
    ].
    ^ warningLabelHolder.
! !

!AbstractSettingsApplication::MemorySettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/memorySettings.html'
! !

!AbstractSettingsApplication::MemorySettingsAppl methodsFor:'initialization & release'!

initialize
    super initialize.
    self warningLabelHolder 
        value:(StringCollection
                with:(resources string:'Warning - invalid settings may result in failures or poor performance.')
                with:(resources string:'You have been warned.') allBold
               ).
! !

!AbstractSettingsApplication::MemorySettingsAppl methodsFor:'queries'!

hasUnsavedChanges
     (self
        hasChangedAspectIn:
            #(
                newSpaceSize
                maxOldSpace
            )
        asComparedTo:ObjectMemory) ifTrue:[^ true].

    ObjectMemory freeSpaceGCAmount ~= self igcFreeAmount value ifTrue:[^ true].
    ObjectMemory freeSpaceGCLimit ~= self igcFreeLimit value ifTrue:[^ true].
    ObjectMemory incrementalGCLimit ~= self igcLimit value ifTrue:[^ true].
    ObjectMemory oldSpaceIncrement ~= self oldIncr value ifTrue:[^ true].
    (ObjectMemory fastMoreOldSpaceLimit:-1) ~= self fastMoreLimit value ifTrue:[^ true].
    ObjectMemory oldSpaceCompressLimit ~= self compressLimit value ifTrue:[^ true].
    ObjectMemory dynamicCodeLimit ~= self codeLimit value ifTrue:[^ true].
    ObjectMemory dynamicCodeGCTrigger ~= self codeTrigger value ifTrue:[^ true].
    (ObjectMemory codeSizeLimitForDynamicCompilation:-1) ~= self methodCodeSizeLimit value ifTrue:[^ true].

    Process defaultMaximumStackSize ~= self stackLimit value ifTrue:[^ true].
    ^ false

    "Modified: / 12-08-2010 / 15:33:12 / cg"
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::MiscCommunicationSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth4Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@!!8@@@@@@BG @@@!!1]P@@@@AWE8@@!!1 '' @@@BGFB^@!!1 5Q8@@BGFBUG !!DWQPH@@B@Q]HD \QFA] @@A1DXE6X"DQ]VY&Y"HQE5I&@ ]QHD@FHBAED"TG
]QD$Q5IVI5ERQ5 !!TVPW]BUBEQIF$REXPT^FY1HV!!@$''HXPXIWU"]!!!!%@GI(BAFGUV\&!!FT@UGQ"PQEW^D]EYP@@PFHHETU5A@U%@@@@I@BGTRT@U%@@@@AH
P"DQ]PU%@@@@@EBUHQU5U%@@@@@@@B !!YHU%@@@@@@@E@ UFY%@@@@@@@@APIH@@@@@@@@@@@@T@@@@@@@@b') ; colorMapFromArray:#[0 0 0 224 224 224 64 64 64 96 96 96 128 128 128 192 192 192 32 32 32 96 96 96 160 160 160 96 96 96]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'G@C O G0_0O8?8_<?(W<?8_<???<=:^<???<???<???<_??<O??<O??<B?=\@?<8@?=0@?? @O?@@W>@@K @@D@@') ; yourself); yourself]
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::MiscCommunicationSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::MiscCommunicationSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::MiscCommunicationSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Communication Settings'
          name: 'Communication Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 732 558)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (FramedBoxSpec
                    label: 'SMTP Server'
                    name: 'SMTPServerBox1'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Box5'
                          layout: (LayoutFrame 0 0 5 0 0 1 28 0)
                          component: 
                         (SpecCollection
                            collection: (
                             (LabelSpec
                                label: 'SMTP Server:'
                                name: 'SMTPLabel'
                                layout: (LayoutFrame 0 0 0 0 150 0 22 0)
                                translateLabel: true
                                adjust: right
                              )
                             (InputFieldSpec
                                name: 'SMTPServer'
                                layout: (LayoutFrame 150 0 0 0 400 0 22 0)
                                model: smtpServerName
                                acceptOnReturn: true
                                acceptOnTab: true
                                acceptOnLostFocus: true
                                acceptOnPointerLeave: false
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                    extent: (Point 732 58)
                  )
                 (FramedBoxSpec
                    label: 'Window migration'
                    name: 'WindowMicrationSetupBox'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (VerticalPanelViewSpec
                          name: 'VerticalPanel2'
                          layout: (LayoutFrame 0 0 0 0 0 1 0 1)
                          horizontalLayout: left
                          verticalLayout: center
                          horizontalSpace: 3
                          verticalSpace: 3
                          component: 
                         (SpecCollection
                            collection: (
                             (ViewSpec
                                name: 'Box2'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (CheckBoxSpec
                                      label: 'Window migration enabled'
                                      name: 'CheckBox2'
                                      layout: (LayoutFrame 5 0 0 0 600 0 22 0)
                                      enableChannel: hasWindowMigrationServer
                                      model: windowMigrationEnabled
                                      translateLabel: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 696 23)
                              )
                             (ViewSpec
                                name: 'Box3'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (CheckBoxSpec
                                      label: 'Password check'
                                      name: 'CheckBox3'
                                      layout: (LayoutFrame 5 0 -2 0 600 0 20 0)
                                      enableChannel: enablePasswordCheck
                                      model: windowMigrationAuthenticate
                                      translateLabel: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 696 22)
                              )
                             (ViewSpec
                                name: 'Box4'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (LabelSpec
                                      label: 'Password:'
                                      name: 'Label3'
                                      layout: (LayoutFrame 0 0 0 0 150 0 22 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'EntryField1'
                                      layout: (LayoutFrame 150 0 0 0 400 0 22 0)
                                      enableChannel: windowMigrationAuthenticate
                                      model: windowMigrationPassword
                                      type: password
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptOnPointerLeave: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 696 22)
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                    extent: (Point 732 115)
                  )
                 (FramedBoxSpec
                    label: 'Remote Browsing'
                    name: 'RemoteBrowsingSetupBox'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Box1'
                          layout: (LayoutFrame 0 0 5 0 0 1 28 0)
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Remote browsing enabled'
                                name: 'CheckBox1'
                                layout: (LayoutFrame 5 0 0 0 600 0 22 0)
                                enableChannel: hasRemoteBrowsingSupport
                                model: remoteBrowsingEnabled
                                translateLabel: true
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                    extent: (Point 732 59)
                  )
                 (FramedBoxSpec
                    label: 'SmallTeam Change Distribution'
                    name: 'SmallTeamSetupBox'
                    visibilityChannel: managerIsCVSSourceCodeManager
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'enableBox'
                          layout: (LayoutFrame 0 0 8 0 0 1 31 0)
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'SmallTeam Server enabled'
                                name: 'CheckBox4'
                                layout: (LayoutFrame 5 0 0 0 600 0 22 0)
                                enableChannel: smallTeamServerAvailable
                                model: smallTeamServerEnabled
                                translateLabel: true
                              )
                             )
                           
                          )
                        )
                       (LabelSpec
                          label: 'SmallTeam Hosts:'
                          name: 'smallTeamHostsLabel'
                          layout: (LayoutFrame 0 0.0 37 0 60 0.25 59 0)
                          translateLabel: true
                          adjust: right
                        )
                       (SequenceViewSpec
                          name: 'smallTeamHostsList'
                          layout: (LayoutFrame 64 0.25 37 0 0 1 131 0)
                          enableChannel: smallTeamServerEnabled
                          tabable: true
                          model: selectedSmallTeamHost
                          hasHorizontalScrollBar: true
                          hasVerticalScrollBar: true
                          miniScrollerHorizontal: true
                          useIndex: false
                          sequenceList: listOfSmallTeamHosts
                        )
                       (LabelSpec
                          label: 'Host:'
                          name: 'hostLabel'
                          layout: (LayoutFrame 0 0.0 142 0 60 0.25 159 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'smallTeamHostEntryField'
                          layout: (LayoutFrame 64 0.25 138 0 0 1 160 0)
                          enableChannel: smallTeamServerEnabled
                          tabable: true
                          model: smallTeamHostEntry
                          acceptChannel: acceptChannel
                          acceptOnPointerLeave: true
                        )
                       (HorizontalPanelViewSpec
                          name: 'HorizontalPanel2'
                          layout: (LayoutFrame 64 0.25 165 0 -1 1 190 0)
                          horizontalLayout: fitSpace
                          verticalLayout: center
                          horizontalSpace: 3
                          verticalSpace: 3
                          component: 
                         (SpecCollection
                            collection: (
                             (ActionButtonSpec
                                label: 'Add'
                                name: 'addButton'
                                translateLabel: true
                                tabable: true
                                model: addSmallTeamHost
                                enableChannel: addHostEnabled
                                extent: (Point 225 22)
                              )
                             (ActionButtonSpec
                                label: 'Remove'
                                name: 'removeButton'
                                translateLabel: true
                                tabable: true
                                model: removeSmallTeamHost
                                enableChannel: removeHostEnabled
                                extent: (Point 225 22)
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                    extent: (Point 732 222)
                  )
                 (FramedBoxSpec
                    label: '.NET Bridge'
                    name: 'FramedBox1'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (VerticalPanelViewSpec
                          name: 'VerticalPanel3'
                          layout: (LayoutFrame 0 0 0 0 0 1 0 1)
                          horizontalLayout: left
                          verticalLayout: center
                          horizontalSpace: 3
                          verticalSpace: 3
                          component: 
                         (SpecCollection
                            collection: (
                             (ViewSpec
                                name: 'Box6'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (CheckBoxSpec
                                      label: 'Verbose'
                                      name: 'CheckBox5'
                                      layout: (LayoutFrame 5 0 5 0 600 0 22 0)
                                      enableChannel: hasDotNetBridge
                                      model: dotNetBridgeVerbose
                                      translateLabel: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 696 23)
                              )
                             (ViewSpec
                                name: 'Box7'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (CheckBoxSpec
                                      label: 'Bridge Runs in IDE'
                                      name: 'CheckBox6'
                                      layout: (LayoutFrame 5 0 3 0 600 0 25 0)
                                      enableChannel: hasDotNetBridge
                                      model: dotNetBridgeRunsInIDE
                                      translateLabel: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 696 22)
                              )
                             )
                           
                          )
                        )
                       (ActionButtonSpec
                          label: 'Close all Connections'
                          name: 'Button1'
                          layout: (LayoutFrame -228 1 27 0 -3 1 49 0)
                          translateLabel: true
                          tabable: true
                          model: closeAllDotNetConnections
                        )
                       )
                     
                    )
                    extent: (Point 732 83)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl methodsFor:'actions'!

basicReadSettings
    |pw auth|

    self 
        readAspects:
            #( 
                smtpServerName
                dotNetBridgeRunsInIDE
                dotNetBridgeVerbose
            )
        from:currentUserPrefs.

    SmallTeam notNil ifTrue:[
        self smallTeamServerEnabled value:(SmallTeam isLoaded and:[SmallTeam serverRunning]).
        self listOfSmallTeamHosts contents:(SmallTeam connectedHosts).
    ].

    self remoteBrowsingEnabled 
        value:(self hasRemoteBrowsingSupport 
               and:[SmalltalkShareServer isLoaded and:[SmalltalkShareServer serverRunning]]).

    self windowMigrationEnabled 
        value:(self hasWindowMigrationServer 
               and:[ WindowMigrationServer isLoaded 
               and:[ WindowMigrationServer serverRunning ]]).

    
    pw := nil.
    auth := false.
    (self hasWindowMigrationServer and:[WindowMigrationServer isLoaded]) ifTrue:[
        pw := WindowMigrationServer password.
        auth := self windowMigrationPassword value notNil
    ].

    self windowMigrationPassword value:pw.
    self windowMigrationAuthenticate value:auth

    "Modified: / 20-09-2007 / 16:04:59 / cg"
!

basicSaveSettings
    self 
        writeAspects:
            #( 
                smtpServerName
                dotNetBridgeRunsInIDE
                dotNetBridgeVerbose
            )
        to:currentUserPrefs.

    (SmallTeam notNil) ifTrue:[
        SmallTeam connectedHosts copy do:[:host |
            (self listOfSmallTeamHosts includes:host) ifFalse:[
                SmallTeam removeHost:host.
            ].
        ].

        self listOfSmallTeamHosts do:[:eachHost |
            SmallTeam addHost:eachHost.
        ].
        self smallTeamServerEnabled value ifTrue:[
            SmallTeam startServer
        ] ifFalse:[
            SmallTeam stopServer
        ].
    ].

    self hasRemoteBrowsingSupport ifTrue:[
        self remoteBrowsingEnabled value ifFalse:[
            SmalltalkShareServer serverRunning ifTrue:[
                SmalltalkShareServer killAll
            ].
        ] ifTrue:[
            SmalltalkShareServer serverRunning ifFalse:[
                SmalltalkShareServer start.
                "/ must wait a bit; give it a chance to
                "/ really start (before checking)
                Delay waitForSeconds:0.5.
                SmalltalkShareServer serverRunning ifFalse:[
                    self warn:'SmalltalkShareServer startup failed (see stderr).'
                ]
            ].
        ].
    ].

    self hasWindowMigrationServer ifTrue:[
        self windowMigrationAuthenticate value ifTrue:[
            WindowMigrationServer password:self windowMigrationPassword value.
        ] ifFalse:[
            WindowMigrationServer password:nil    
        ].
        self windowMigrationEnabled value ifFalse:[
            WindowMigrationServer serverRunning ifTrue:[
                WindowMigrationServer stop
            ].
        ] ifTrue:[
            WindowMigrationServer serverRunning ifFalse:[
                WindowMigrationServer start.
                "/ must wait a bit; give it a chance to
                "/ really start (before checking)
                Delay waitForSeconds:0.5.
                WindowMigrationServer serverRunning ifFalse:[
                    self warn:'WindowMigrationServer startup failed (see stderr).'
                ]
            ].
        ].
    ].

    "Modified: / 20-09-2007 / 16:05:01 / cg"
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl methodsFor:'aspects'!

acceptChannel

    acceptChannel isNil ifTrue:[
        acceptChannel := TriggerValue new.
    ].
    ^ acceptChannel.

    "Created: / 12-11-2006 / 19:04:09 / cg"
!

dotNetBridgeRunsInIDE

    dotNetBridgeRunsInIDE isNil ifTrue:[
        dotNetBridgeRunsInIDE := false asValue.
        dotNetBridgeRunsInIDE onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ dotNetBridgeRunsInIDE.
!

dotNetBridgeVerbose

    dotNetBridgeVerbose isNil ifTrue:[
        dotNetBridgeVerbose := false asValue.
        dotNetBridgeVerbose onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ dotNetBridgeVerbose.
!

enablePasswordCheck

    enablePasswordCheck isNil ifTrue:[
        self hasWindowMigrationServer ifFalse:[
            enablePasswordCheck := false asValue.
        ] ifTrue:[
            enablePasswordCheck := self windowMigrationEnabled.
        ].
    ].
    ^ enablePasswordCheck.
!

hasDotNetBridge
    ^ DOTNET::DotNet notNil and:[ DOTNET::DotNet isLoaded ].
!

listOfSmallTeamHosts

    listOfSmallTeamHosts isNil ifTrue:[
        listOfSmallTeamHosts := List new.
        listOfSmallTeamHosts onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ listOfSmallTeamHosts.

    "Created: / 12-11-2006 / 19:06:35 / cg"
!

remoteBrowsingEnabled

    remoteBrowsingEnabled isNil ifTrue:[
        remoteBrowsingEnabled := true asValue.
        remoteBrowsingEnabled onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ remoteBrowsingEnabled.
!

removeHostEnabled
    ^ BlockValue 
        forLogical:self smallTeamServerEnabled 
        and:(BlockValue
                with:[:h | h notEmptyOrNil] 
                argument:self selectedSmallTeamHost)

    "Created: / 12-11-2006 / 19:01:42 / cg"
    "Modified: / 08-03-2007 / 23:02:36 / cg"
!

selectedSmallTeamHost

    selectedSmallTeamHost isNil ifTrue:[
        selectedSmallTeamHost := nil asValue.
        selectedSmallTeamHost addDependent:self
    ].
    ^ selectedSmallTeamHost.

    "Created: / 12-11-2006 / 19:11:01 / cg"
!

smallTeamHostEntry

    smallTeamHostEntry isNil ifTrue:[
        smallTeamHostEntry := nil asValue.
        smallTeamHostEntry onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ smallTeamHostEntry.

    "Created: / 12-11-2006 / 19:07:06 / cg"
!

smallTeamServerAvailable
    ^ SmallTeam notNil.

    "Created: / 12-11-2006 / 18:56:20 / cg"
!

smallTeamServerEnabled

    smallTeamServerEnabled isNil ifTrue:[
        smallTeamServerEnabled := false asValue.
        smallTeamServerEnabled onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ smallTeamServerEnabled.

    "Created: / 12-11-2006 / 18:56:11 / cg"
!

smtpServerName

    smtpServerName isNil ifTrue:[
        smtpServerName := '' asValue.
        smtpServerName onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ smtpServerName.

    "Created: / 20-09-2007 / 16:04:39 / cg"
!

windowMigrationAuthenticate

    windowMigrationAuthenticate isNil ifTrue:[
        windowMigrationAuthenticate := true asValue.
        windowMigrationAuthenticate onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ windowMigrationAuthenticate.
!

windowMigrationEnabled

    windowMigrationEnabled isNil ifTrue:[
        windowMigrationEnabled := true asValue.
        windowMigrationEnabled onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ windowMigrationEnabled.
!

windowMigrationPassword

    windowMigrationPassword isNil ifTrue:[
        windowMigrationPassword := ValueHolder new.
        windowMigrationPassword onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ windowMigrationPassword.
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl methodsFor:'change & update'!

selectedSmallTeamHostChanged
    self acceptChannel value:true.    
    self smallTeamHostEntry value:( self selectedSmallTeamHost value).

    "Created: / 12-11-2006 / 19:09:49 / cg"
!

update:someting with:aParameter from:changedObject
    changedObject == selectedSmallTeamHost ifTrue:[
        self selectedSmallTeamHostChanged.
        ^ self
    ].

    super update:someting with:aParameter from:changedObject

    "Created: / 12-11-2006 / 19:09:40 / cg"
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/communicationsSettings.html'
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl methodsFor:'initialization & release'!

initialize
    super initialize.
    self readSettings.
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl methodsFor:'queries'!

addHostEnabled
    ^ self smallTeamServerEnabled

    "Created: / 12-11-2006 / 19:01:37 / cg"
!

hasRemoteBrowsingSupport

    ^ SmalltalkShareServer notNil
!

hasUnsavedChanges
    (self
        hasChangedAspectIn:
            #(
                smtpServerName
                dotNetBridgeRunsInIDE
                dotNetBridgeVerbose
            )
        asComparedTo:currentUserPrefs) ifTrue:[^ true].

    SmallTeam notNil ifTrue:[
        self smallTeamServerEnabled value ~= (SmallTeam isLoaded and:[SmallTeam serverRunning]) ifTrue:[^ true].
        self listOfSmallTeamHosts asSet ~= (SmallTeam connectedHosts asSet) ifTrue:[^ true].
    ].

    (self hasRemoteBrowsingSupport and:[SmalltalkShareServer isLoaded]) ifTrue:[
        self remoteBrowsingEnabled value ~~ SmalltalkShareServer serverRunning ifTrue:[^ true].
    ].
    self hasWindowMigrationServer ifTrue:[
        WindowMigrationServer isLoaded ifFalse:[
            self windowMigrationEnabled value ifTrue:[
                WindowMigrationServer autoload.
            ].
        ].
        (self windowMigrationEnabled value ~~ WindowMigrationServer serverRunning) ifTrue:[^ true].
        (self windowMigrationPassword value ~= WindowMigrationServer password)  ifTrue:[^ true].
        (self windowMigrationAuthenticate value ~= self windowMigrationPassword value notNil) ifTrue:[^ true].
    ].
    ^ false

    "Modified: / 20-09-2007 / 16:04:56 / cg"
!

hasWindowMigrationServer

    ^ WindowMigrationServer notNil
! !

!AbstractSettingsApplication::MiscCommunicationSettingsAppl methodsFor:'user actions'!

addSmallTeamHost
    |host|

    acceptChannel value:true.    

    host := self smallTeamHostEntry value.

    host size > 0 ifTrue:[
        self listOfSmallTeamHosts add:host
    ].

    "Modified: / 12-11-2006 / 19:06:22 / cg"
!

closeAllDotNetConnections
    DOTNET::DotNet notNil ifTrue:[
        DOTNET::DotNet exitAllLiveInstances
    ].
!

removeSmallTeamHost
    |host|

    acceptChannel value:true.    

    host := self selectedSmallTeamHost value.

    host size > 0 ifTrue:[
        self selectedSmallTeamHost value:nil.
        self listOfSmallTeamHosts remove:host ifAbsent:[ self window beep ].
        self smallTeamHostEntry value:''.
    ].

    "Modified: / 12-11-2006 / 19:15:05 / cg"
! !

!AbstractSettingsApplication::MiscDisplay2SettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::MiscDisplay2SettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(8)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@A @F@@@@@@@@@@@@@@@@@@@@@@@@@@X@A @@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@
@@@@@@@@@@@@@@@@@@@@@@@@@@@@CP4MCP4MCP4MCP4MCP4M@@@@@@@@@04B@0<ODADRD!!LT@ LCCP@@@@@@@@LM@ LOC1@QD!!HSE@HC@04@@@@@@@@CCPLN
EQTUE!!XVE1\CC 8M@@@@@@@@@0TB@ HB@ HB@ HBB (JAP@@@@@@@@LE@ HB@ HB@ HB@ (JB T@@A(XF@@CAPHB@ HB@ HB@ (JB (E@ @@@@@@@0TB@ HB
@ HB@ HJB (JAPH@@A @@@LE@ HB@ HB@ HBB (JB T@@@@X@@@CAPHB@ HB@ HB@ (JB (E@@@@F@@@@0TB@ HB@ HB@ (JB (JAP@@F!!(X@@LE@ HB@ HB
@ HBB (JB T@@A(XF@@CAPHB@ HB@ HBB (JB (E@@@ZFA @@0TEAPTEAPTEAPTEAPTEAP@@F!! X@@LC@0LC@0LC@0LC@0LC@0@@@A(ZF@@@@@@@@@@@@@@@
@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@a') ; colorMapFromArray:#[0 0 0 32 96 80 240 240 240 192 192 192 64 144 128 80 80 80 48 112 112 48 128 128 32 96 96 48 128 112 224 224 224 32 80 80 64 96 96 0 80 128 128 128 128 16 144 192 16 128 176 16 128 160 0 112 160 0 112 144 0 96 144 16 112 144 0 96 128 0 80 112 100 100 100 127 127 127 255 255 0]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@8@@@8@@@P@@@P_?<P??<P??<P??<P??<8??=<???<??>8??<8??<8??=<??=<??=<??=<??9<@@@8@@@@') ; yourself); yourself]
! !

!AbstractSettingsApplication::MiscDisplay2SettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::MiscDisplay2SettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::MiscDisplay2SettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::MiscDisplay2SettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Display settings 2'
          name: 'Display settings 2'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 671 591)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0 0 0 0 1 0 1)
              horizontalLayout: fitSpace
              verticalLayout: topSpace
              horizontalSpace: 5
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Use Native Widgets (Experimental & Unfinished Feature)'
                    name: 'NativeWidgets'
                    enableChannel: displaySupportsNativeWidgets
                    model: nativeWidgets
                    translateLabel: true
                    extent: (Point 661 22)
                  )
                 (CheckBoxSpec
                    label: 'Use Native Dialogs (Experimental & Unfinished Feature)'
                    name: 'NativeDialogs'
                    enableChannel: displaySupportsNativeDialogs
                    model: nativeDialogs
                    translateLabel: true
                    extent: (Point 661 22)
                  )
                 (CheckBoxSpec
                    label: 'Use Native File Dialogs (Experimental & Unfinished Feature)'
                    name: 'CheckBox1'
                    enableChannel: displaySupportsNativeFileDialogs
                    model: nativeFileDialogs
                    translateLabel: true
                    extent: (Point 661 22)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace1'
                    extent: (Point 661 5)
                  )
                 (DividerSpec
                    name: 'Separator1'
                    extent: (Point 661 4)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace2'
                    extent: (Point 661 5)
                  )
                 (CheckBoxSpec
                    label: 'Shadows under PopUp Views'
                    name: 'shadows'
                    model: shadows
                    translateLabel: true
                    extent: (Point 661 22)
                  )
                 (CheckBoxSpec
                    label: 'Opaque Variable Panel Resizing'
                    name: 'opaqueVariablePanelResize'
                    model: opaqueVariablePanelResizing
                    translateLabel: true
                    extent: (Point 661 22)
                  )
                 (CheckBoxSpec
                    label: 'Opaque Table Column Resizing'
                    name: 'opaqueTableColumnResize'
                    model: opaqueTableColumnResizing
                    translateLabel: true
                    extent: (Point 661 22)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace3'
                    extent: (Point 661 4)
                  )
                 (DividerSpec
                    name: 'Separator3'
                    extent: (Point 661 3)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace4'
                    extent: (Point 661 3)
                  )
                 (CheckBoxSpec
                    label: 'Right-Click in Title brings Window to Back'
                    name: 'lowerOnRightClickInTitle'
                    enableChannel: isWindowsDisplay
                    model: lowerOnRightClickInTitle
                    translateLabel: true
                    extent: (Point 661 21)
                  )
                 (CheckBoxSpec
                    label: 'Shift-Click in Title brings Window to Back'
                    name: 'lowerOnShiftClickInTitle'
                    enableChannel: isWindowsDisplay
                    model: lowerOnShiftClickInTitle
                    translateLabel: true
                    extent: (Point 661 21)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::MiscDisplay2SettingsAppl methodsFor:'actions'!

aspectsFromUserPreferences
    ^ #(
        opaqueVariablePanelResizing
        opaqueTableColumnResizing
    )

    "Modified: / 24-08-2010 / 17:26:38 / sr"
!

basicReadSettings
    |currentScreen|

    currentScreen := Screen current.

    self 
        readAspects:
            #( 
                nativeWidgets
                nativeDialogs
                nativeFileDialogs
            )
        from:currentScreen.

    self 
        readAspects:(self aspectsFromUserPreferences)
        from:currentUserPrefs.

    self shadows value:PopUpView shadows.

    currentScreen platformName = 'WIN32' ifTrue:[   
        self lowerOnRightClickInTitle value:(currentScreen rightButtonIsLowerWindow:nil).
        self lowerOnShiftClickInTitle value:(currentScreen shiftedLeftButtonIsLowerWindow:nil).
    ].

    "Modified: / 24-08-2010 / 16:43:39 / sr"
!

basicSaveSettings
    |currentScreen mustReopenTools|

    mustReopenTools := false.

    currentScreen := Screen current.

    self displaySupportsNativeWidgets ifTrue:[
        currentScreen nativeWidgets ~= self nativeWidgets value ifTrue:[
            mustReopenTools := true.
            currentScreen nativeWidgets:self nativeWidgets value.
            currentUserPrefs nativeWidgets:self nativeWidgets value.
        ].
    ].
    self displaySupportsNativeDialogs ifTrue:[
        currentScreen nativeDialogs:self nativeDialogs value.
        currentUserPrefs nativeDialogs:self nativeDialogs value.
    ].
    self displaySupportsNativeFileDialogs ifTrue:[
        currentScreen nativeFileDialogs:self nativeFileDialogs value.
        currentUserPrefs nativeFileDialogs:self nativeFileDialogs value.
    ].

    PopUpView shadows:self shadows value.

    self 
        writeAspects:(self aspectsFromUserPreferences)
        to:currentUserPrefs.

    currentScreen platformName = 'WIN32' ifTrue:[
        currentScreen rightButtonIsLowerWindow:(self lowerOnRightClickInTitle value).
        currentScreen shiftedLeftButtonIsLowerWindow:(self lowerOnShiftClickInTitle value).
    ].

    mustReopenTools ifTrue:[
        self reopenToolsAfterChangedViewStyleSetting.
    ].

    "Modified: / 24-08-2010 / 17:27:25 / sr"
! !

!AbstractSettingsApplication::MiscDisplay2SettingsAppl methodsFor:'aspects'!

displaySupportsNativeDialogs
    ^ Screen current supportsNativeDialogs
!

displaySupportsNativeFileDialogs
    ^ Screen current supportsNativeFileDialogs

    "Modified: / 24-08-2010 / 16:28:58 / sr"
!

displaySupportsNativeWidgets
    ^ Screen current supportsNativeWidgets
!

lowerOnRightClickInTitle
    lowerOnRightClickInTitle isNil ifTrue:[
        lowerOnRightClickInTitle := true asValue.
        lowerOnRightClickInTitle onChangeSend:#updateModifiedChannel to:self
    ].
    ^ lowerOnRightClickInTitle.
!

lowerOnShiftClickInTitle
    lowerOnShiftClickInTitle isNil ifTrue:[
        lowerOnShiftClickInTitle := true asValue.
        lowerOnShiftClickInTitle onChangeSend:#updateModifiedChannel to:self
    ].
    ^ lowerOnShiftClickInTitle.
!

nativeDialogs
    nativeDialogs isNil ifTrue:[
        nativeDialogs := Screen current nativeDialogs asValue.
        nativeDialogs onChangeSend:#updateModifiedChannel to:self
    ].
    ^ nativeDialogs.
!

nativeFileDialogs
    nativeFileDialogs isNil ifTrue:[
        nativeFileDialogs := Screen current nativeFileDialogs asValue.
        nativeFileDialogs onChangeSend:#updateModifiedChannel to:self
    ].
    ^ nativeFileDialogs

    "Modified: / 24-08-2010 / 16:43:08 / sr"
!

nativeWidgets
    nativeWidgets isNil ifTrue:[
        nativeWidgets := Screen current nativeWidgets asValue.
        nativeWidgets onChangeSend:#updateModifiedChannel to:self
    ].
    ^ nativeWidgets.
!

opaqueTableColumnResizing
    opaqueTableColumnResize isNil ifTrue:[
        opaqueTableColumnResize := true asValue.
        opaqueTableColumnResize onChangeSend:#updateModifiedChannel to:self
    ].
    ^ opaqueTableColumnResize.
!

opaqueVariablePanelResizing
    opaqueVariablePanelResize isNil ifTrue:[
        opaqueVariablePanelResize := true asValue.
        opaqueVariablePanelResize onChangeSend:#updateModifiedChannel to:self
    ].
    ^ opaqueVariablePanelResize.
!

shadows
    shadows isNil ifTrue:[
        shadows := PopUpView shadows asValue.
        shadows onChangeSend:#updateModifiedChannel to:self
    ].
    ^ shadows.
! !

!AbstractSettingsApplication::MiscDisplay2SettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/miscSettings.html'
! !

!AbstractSettingsApplication::MiscDisplay2SettingsAppl methodsFor:'queries'!

hasUnsavedChanges
     |currentScreen|

     currentScreen := Screen current.

     (self
        hasChangedAspectIn:
            #(
                nativeWidgets
                nativeDialogs
                nativeFileDialogs
            )
        asComparedTo:currentScreen) ifTrue:[^ true].

     (self
        hasChangedAspectIn:(self aspectsFromUserPreferences)
        asComparedTo:currentUserPrefs) ifTrue:[^ true].

    self shadows value ~= PopUpView shadows ifTrue:[^ true].

    currentScreen platformName = 'WIN32' ifTrue:[   
        (currentScreen rightButtonIsLowerWindow:nil) ~= (self lowerOnRightClickInTitle value) ifTrue:[^ true].
        (currentScreen shiftedLeftButtonIsLowerWindow:nil) ~= (self lowerOnShiftClickInTitle value) ifTrue:[^ true].
    ].
    ^ false

    "Modified: / 24-08-2010 / 16:44:43 / sr"
!

isWindowsDisplay
     ^ Screen current platformName = 'WIN32'
! !

!AbstractSettingsApplication::MiscDisplaySettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::MiscDisplaySettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(8)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@DA@@@@@@@@@@@@@@@@@@@@@@@@@@DB@0D@@@@@@@@@@@@@@@@@@@@@@@DB@0LD@P@@@@@@@@@@@@@@@@@@@@DB@0LDA@DA@@@@@@@@@@@@
@@@@@@TB@ HDA@XF@PD@@@@@@@@@@@@@@@TB@ HB@ \FA  H@P@@@@@@@@@@@@TB@ HB@ HBB@XIB@ A@@@@@@@@@@TB@ HB@ HB@ (KB@ KB0DC@@@@@@TB
@ HB@ HB@ HB@ ,KB0LC@P@@@@@@APHB@ HB@ HBB (JB0LC@0HL@@4MCP4MCP4MCP4MCP4MCP4AC HE@@@MCPHCC0<PDQHRD1PB@0LM@ DE@@@@CP4B@0<O
DADRD!!LT@ LCCPHE@@@@@@4M@08UEQTVE!!XWE0LNC 4E@@@@@@@EAPHB@ HB@ HB@ HJB (E@@@@@@@@APTB@ HB@ HB@ HBB (JAP@@@@@@@@TE@ HB@ HB
@ HBB (JB T@@@@@@@@EAPHB@ HB@ HB@ (JB (E@@@@@@@@APTB@ HB@ HB@ HJB (JAP@@@@@@@@TE@ HB@ HB@ HBB (JB T@@@@@@@@EAPHB@ HB@ HB
B (JB (E@@@@@@@@APTEAPTEAPTEAPTEAPTEAP@@@@@@@@@a') ; colorMapFromArray:#[0 0 0 32 96 80 240 240 240 192 192 192 64 144 128 80 80 80 48 112 112 48 128 128 32 96 96 48 128 112 224 224 224 32 80 80 64 96 96 0 80 128 128 128 128 16 144 192 16 128 176 16 128 160 0 112 160 0 112 144 0 96 144 16 112 144 0 96 128 0 80 112]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@C@@@G @@O0@@_8@@?<@A?>@C??@G??0O??0G??8???0??? ???@??>@??<@??<@??<@??<@??<@??<@??<@??<@') ; yourself); yourself]
! !

!AbstractSettingsApplication::MiscDisplaySettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::MiscDisplaySettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::MiscDisplaySettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::MiscDisplaySettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Display settings'
          name: 'Display settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 445 497)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0 0 0 0 1 0 1)
              horizontalLayout: fitSpace
              verticalLayout: topSpace
              horizontalSpace: 5
              verticalSpace: 1
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Beeper enabled'
                    name: 'beepEnabled'
                    model: beepEnabled
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (CheckBoxSpec
                    label: 'Show Accelerator Keys in Menus'
                    name: 'showAccelerators'
                    model: showAccelerators
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace1'
                    extent: (Point 435 4)
                  )
                 (DividerSpec
                    name: 'Separator1'
                    extent: (Point 435 3)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace2'
                    extent: (Point 435 3)
                  )
                 (CheckBoxSpec
                    label: 'Keyboard Focus Follows Mouse'
                    name: 'focusFollowsMouse'
                    model: focusFollowsMouse
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (CheckBoxSpec
                    label: 'Views Catch Focus when Mapped'
                    name: 'takeFocus'
                    model: takeFocus
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (CheckBoxSpec
                    label: 'Boxes Return Focus to Previously Active View'
                    name: 'returnFocus'
                    model: returnFocus
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (CheckBoxSpec
                    label: 'Raise & Activate Windows on Click'
                    name: 'activateOnClick'
                    model: activateOnClick
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (CheckBoxSpec
                    label: 'Force Windows into Monitor''s Bounds'
                    name: 'CheckBox2'
                    activeHelpKey: forceWindowsIntoMonitorBounds
                    model: forceWindowsIntoMonitorBounds
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace3'
                    extent: (Point 435 4)
                  )
                 (DividerSpec
                    name: 'Separator2'
                    extent: (Point 435 3)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace4'
                    extent: (Point 435 3)
                  )
                 (CheckBoxSpec
                    label: 'MouseWheel Focus Follows Mouse'
                    name: 'mouseWheelFocusFollowsMouse'
                    enableChannel: mouseWheelFocusFollowsMouseEnabled
                    model: mouseWheelFocusFollowsMouse
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (CheckBoxSpec
                    label: 'CTRL-MouseWheel is Zoom'
                    name: 'CheckBox1'
                    model: allowMouseWheelZoom
                    translateLabel: true
                    extent: (Point 435 22)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace5'
                    extent: (Point 435 4)
                  )
                 (DividerSpec
                    name: 'Separator3'
                    extent: (Point 435 4)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace6'
                    extent: (Point 435 3)
                  )
                 (CheckBoxSpec
                    label: 'Select on Right-Button-Press'
                    name: 'selectOnRightClick'
                    model: selectOnRightClick
                    translateLabel: true
                    extent: (Point 435 21)
                  )
                 (CheckBoxSpec
                    label: 'Menu on Right-Button-Release'
                    name: 'showRightButtonMenuOnRelease'
                    model: showRightButtonMenuOnRelease
                    translateLabel: true
                    extent: (Point 435 21)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace7'
                    extent: (Point 435 4)
                  )
                 (DividerSpec
                    name: 'Separator4'
                    extent: (Point 435 4)
                  )
                 (ViewSpec
                    name: 'SeparatingSpace8'
                    extent: (Point 435 4)
                  )
                 (ViewSpec
                    name: 'Box1'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Label'
                          name: 'Label1'
                          layout: (LayoutFrame 0 0 0 0 167 0 17 0)
                          translateLabel: true
                          labelChannel: formatHostNameWindowLabel
                          adjust: right
                          useDefaultExtent: true
                        )
                       (LabelSpec
                          label: 'Label'
                          name: 'Label2'
                          layout: (LayoutFrame 0 0.3 30 0 0 0.6 0 1)
                          translateLabel: true
                          labelChannel: formatHostNameWindowLabel1
                          adjust: left
                        )
                       (LabelSpec
                          label: 'Label'
                          name: 'Label3'
                          layout: (LayoutFrame 0 0.6 30 0 0 1 0 1)
                          translateLabel: true
                          labelChannel: formatHostNameWindowLabel2
                          adjust: left
                        )
                       )
                     
                    )
                    extent: (Point 435 92)
                  )
                 (ViewSpec
                    name: 'WindowLabelBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Window Label Format'
                          name: 'hostNameInLabelHolder'
                          layout: (LayoutFrame 0 0 -22 1 216 0 0 1)
                          model: hostNameInLabelHolder
                          translateLabel: true
                        )
                       (InputFieldSpec
                          name: 'hostNameInLabelEntryField'
                          layout: (LayoutFrame 218 0 -22 1 -5 1 0 1)
                          enableChannel: hostNameInLabelHolder
                          model: newWindowLabelFormat
                          immediateAccept: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 435 30)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::MiscDisplaySettingsAppl methodsFor:'actions'!

aspectsFromUserPreferences
    ^ #(
        beepEnabled
        focusFollowsMouse
        mouseWheelFocusFollowsMouse 
        showRightButtonMenuOnRelease
        selectOnRightClick
        allowMouseWheelZoom
        forceWindowsIntoMonitorBounds
    )

    "Modified: / 22-10-2010 / 14:25:54 / cg"
!

basicReadSettings
    self 
        readAspects:(self aspectsFromUserPreferences)
        from:currentUserPrefs.

    self newWindowLabelFormat value:StandardSystemView windowLabelFormat.
    self hostNameInLabelHolder value:StandardSystemView includeHostNameInLabel.
    self returnFocus value:StandardSystemView returnFocusWhenClosingModalBoxes.
    self takeFocus value:StandardSystemView takeFocusWhenMapped.
    self activateOnClick value:(Display activateOnClick:nil).
    self showAccelerators value:MenuView showAcceleratorKeys.
!

basicSaveSettings
    |currentScreen|

    currentScreen := Screen current.

    (self hostNameInLabelHolder value ~= StandardSystemView includeHostNameInLabel 
    or:[self newWindowLabelFormat value ~= StandardSystemView windowLabelFormat]) ifTrue:[ 
        StandardSystemView includeHostNameInLabel:self hostNameInLabelHolder value.
        self newWindowLabelFormat value notNil ifTrue:[
            StandardSystemView windowLabelFormat:self newWindowLabelFormat value
        ].

        Screen allScreens do:[:aDisplay |
            aDisplay allViewsDo:[:aView |
                |l|

                aView isTopView ifTrue:[
                    l := aView label.
                    l notNil ifTrue:[
                        aView label:(l , ' '); label:l.  "/ force a change
                    ]
                ]
            ]
        ]
    ].

    self 
        writeAspects:(self aspectsFromUserPreferences)
        to:currentUserPrefs.

    StandardSystemView returnFocusWhenClosingModalBoxes:self returnFocus value.
    StandardSystemView takeFocusWhenMapped:self takeFocus value.
    currentScreen activateOnClick:self activateOnClick value.

    MenuView showAcceleratorKeys:self showAccelerators value.

    "Modified: / 16.12.2002 / 18:06:31 / penk"
!

formatHostNameinWindowLabels
    |newFormat|

    newFormat := Dialog 
                request:'Define the Format of Window Labels:\\  %1 - Label\  %2 - Hostname\  %3 - Username\  %4 - ProcessId\' 
                        withCRs
                initialAnswer:newWindowLabelFormat.
    newFormat size > 0 ifTrue:[
        newWindowLabelFormat := newFormat.
        self updateModifiedChannel
    ]
! !

!AbstractSettingsApplication::MiscDisplaySettingsAppl methodsFor:'aspects'!

activateOnClick
    activateOnClick isNil ifTrue:[
        activateOnClick := true asValue.
        activateOnClick onChangeSend:#updateModifiedChannel to:self
    ].
    ^ activateOnClick.
!

allowMouseWheelZoom
    allowMouseWheelZoom isNil ifTrue:[
        allowMouseWheelZoom := true asValue.
        allowMouseWheelZoom onChangeSend:#updateModifiedChannel to:self
    ].
    ^ allowMouseWheelZoom.
!

beepEnabled
    beepEnabled isNil ifTrue:[
        beepEnabled := true asValue.
        beepEnabled onChangeSend:#updateModifiedChannel to:self
    ].
    ^ beepEnabled.
!

displaySupportsNativeDialogs
    ^ Screen current supportsNativeDialogs
!

displaySupportsNativeWidgets
    ^ Screen current supportsNativeWidgets
!

focusFollowsMouse
    focusFollowsMouse isNil ifTrue:[
        focusFollowsMouse := true asValue.
        focusFollowsMouse onChangeSend:#updateModifiedChannel to:self
    ].
    ^ focusFollowsMouse.
!

forceWindowsIntoMonitorBounds
    forceWindowsIntoMonitorBounds isNil ifTrue:[
        forceWindowsIntoMonitorBounds := true asValue.
        forceWindowsIntoMonitorBounds onChangeSend:#updateModifiedChannel to:self
    ].
    ^ forceWindowsIntoMonitorBounds.

    "Created: / 22-10-2010 / 14:25:40 / cg"
!

formatHostNameWindowLabel
    formatHostNameWindowLabel isNil ifTrue:[
        formatHostNameWindowLabel := 
            (resources string:'Window Label Format:').
    ].
    ^ formatHostNameWindowLabel.

    "Created: / 16-12-2002 / 17:50:49 / penk"
    "Modified: / 22-08-2006 / 11:43:41 / cg"
!

formatHostNameWindowLabel1
    formatHostNameWindowLabel1 isNil ifTrue:[
        formatHostNameWindowLabel1 := 
            (resources string:
'%1 - Label
%2 - Hostname 
%3 - Username')  
    ].
    ^ formatHostNameWindowLabel1.

    "Created: / 16-12-2002 / 17:50:49 / penk"
    "Modified: / 22-08-2006 / 11:43:41 / cg"
!

formatHostNameWindowLabel2
    formatHostNameWindowLabel2 isNil ifTrue:[
        formatHostNameWindowLabel2 := 
            (resources string:
'%4 - ProcessId
%5 - TOP-Directory
%6 - TOP-Path').
    ].
    ^ formatHostNameWindowLabel2.

    "Created: / 16-12-2002 / 17:50:49 / penk"
    "Modified: / 22-08-2006 / 11:43:41 / cg"
!

hostNameInLabelHolder
    hostNameInLabelHolder isNil ifTrue:[
        hostNameInLabelHolder := true asValue.
        hostNameInLabelHolder onChangeSend:#updateModifiedChannel to:self
    ].
    ^ hostNameInLabelHolder.
!

mouseWheelFocusFollowsMouse
    mouseWheelFocusFollowsMouse isNil ifTrue:[
        mouseWheelFocusFollowsMouse := true asValue.
        mouseWheelFocusFollowsMouse onChangeSend:#updateModifiedChannel to:self
    ].
    ^ mouseWheelFocusFollowsMouse.
!

mouseWheelFocusFollowsMouseEnabled
    ^ BlockValue
        forLogicalNot:(self focusFollowsMouse).
!

newWindowLabelFormat
    newWindowLabelFormat isNil ifTrue:[
        newWindowLabelFormat := true asValue.
        newWindowLabelFormat onChangeSend:#updateModifiedChannel to:self
    ].
    ^ newWindowLabelFormat.

    "Created: / 16.12.2002 / 17:50:49 / penk"
!

returnFocus
    returnFocus isNil ifTrue:[
        returnFocus := true asValue.
        returnFocus onChangeSend:#updateModifiedChannel to:self
    ].
    ^ returnFocus.
!

selectOnRightClick
    selectOnRightClick isNil ifTrue:[
        selectOnRightClick := true asValue.
        selectOnRightClick onChangeSend:#updateModifiedChannel to:self
    ].
    ^ selectOnRightClick.
!

showAccelerators
    showAccelerators isNil ifTrue:[
        showAccelerators := true asValue.
        showAccelerators onChangeSend:#updateModifiedChannel to:self
    ].
    ^ showAccelerators.
!

showRightButtonMenuOnRelease
    showRightButtonMenuOnRelease isNil ifTrue:[
        showRightButtonMenuOnRelease := true asValue.
        showRightButtonMenuOnRelease onChangeSend:#updateModifiedChannel to:self
    ].
    ^ showRightButtonMenuOnRelease.
!

takeFocus
    takeFocus isNil ifTrue:[
        takeFocus := true asValue.
        takeFocus onChangeSend:#updateModifiedChannel to:self
    ].
    ^ takeFocus.
! !

!AbstractSettingsApplication::MiscDisplaySettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/miscSettings.html'
! !

!AbstractSettingsApplication::MiscDisplaySettingsAppl methodsFor:'queries'!

hasUnsavedChanges
     (self
        hasChangedAspectIn:(self aspectsFromUserPreferences)
        asComparedTo:currentUserPrefs) ifTrue:[^ true].

    self newWindowLabelFormat value ~= StandardSystemView windowLabelFormat ifTrue:[^ true].
    self hostNameInLabelHolder value ~= StandardSystemView includeHostNameInLabel ifTrue:[^ true].
    self returnFocus value ~= StandardSystemView returnFocusWhenClosingModalBoxes ifTrue:[^ true].
    self takeFocus value ~= StandardSystemView takeFocusWhenMapped ifTrue:[^ true].
    self activateOnClick value ~= (Display activateOnClick:nil) ifTrue:[^ true].
    self showAccelerators value ~= MenuView showAcceleratorKeys ifTrue:[^ true].
    ^ false
! !

!AbstractSettingsApplication::OsiSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ AbstractSettingsApplication::MiscCommunicationSettingsAppl defaultIcon.
! !

!AbstractSettingsApplication::OsiSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::OsiSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::OsiSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::OsiSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'OSI Protocols Settings'
          name: 'OSI Protocols Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 600 550)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (LabelSpec
                    label: 'ACSE'
                    name: 'Label1'
                    translateLabel: true
                    extent: (Point 600 22)
                  )
                 (ViewSpec
                    name: 'Box1a'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Errors'
                          name: 'CheckBox1'
                          layout: (LayoutFrame 25 0 0 0 -2 0.33 22 0)
                          enableChannel: osiACSEPresent
                          model: osiACSEErrorLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 27)
                  )
                 (ViewSpec
                    name: 'Box1b'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Connections'
                          name: 'CheckBox10'
                          layout: (LayoutFrame 25 0 0 0 -2 0.66 22 0)
                          enableChannel: osiACSEPresent
                          model: osiACSEConnectionLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 26)
                  )
                 (ViewSpec
                    name: 'Box1c'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Data Transfer'
                          name: 'CheckBox14'
                          layout: (LayoutFrame 25 0 0 0 -2 1 22 0)
                          enableChannel: osiACSEPresent
                          model: osiACSEDataLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 26)
                  )
                 (DividerSpec
                    name: 'Separator1'
                    extent: (Point 600 4)
                  )
                 (LabelSpec
                    label: 'ROSE'
                    name: 'Label2'
                    translateLabel: true
                    extent: (Point 600 22)
                  )
                 (ViewSpec
                    name: 'Box4a'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Errors'
                          name: 'CheckBox4'
                          layout: (LayoutFrame 25 0 0 0 -2 0.33 22 0)
                          enableChannel: osiROSEPresent
                          model: osiROSEErrorLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 25)
                  )
                 (ViewSpec
                    name: 'Box4b'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Invoactions'
                          name: 'CheckBox16'
                          layout: (LayoutFrame 25 0 0 0 -2 0.66 22 0)
                          enableChannel: osiROSEPresent
                          model: osiROSEInvokationLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 25)
                  )
                 (ViewSpec
                    name: 'Box4c'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Responses'
                          name: 'CheckBox20'
                          layout: (LayoutFrame 25 0 0 0 -2 1 22 0)
                          enableChannel: osiROSEPresent
                          model: osiROSEResponseLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 25)
                  )
                 (DividerSpec
                    name: 'Separator2'
                    extent: (Point 600 3)
                  )
                 (LabelSpec
                    label: 'CMISE'
                    name: 'Label3'
                    translateLabel: true
                    extent: (Point 600 22)
                  )
                 (ViewSpec
                    name: 'Box7a'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Errors'
                          name: 'CheckBox7'
                          layout: (LayoutFrame 25 0 0 0 -2 0.33 22 0)
                          enableChannel: osiCMISEPresent
                          model: osiCMISEErrorLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 22)
                  )
                 (ViewSpec
                    name: 'Box7b'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Messages'
                          name: 'CheckBox22'
                          layout: (LayoutFrame 25 0 0 0 -2 0.66 22 0)
                          enableChannel: osiCMISEPresent
                          model: osiCMISEMessageLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 22)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::OsiSettingsAppl methodsFor:'actions'!

basicReadSettings
    self osiACSEPresent value:(OSI::ACSE notNil and:[OSI::ACSE isLoaded]).
    self osiROSEPresent value:(OSI::ROSE notNil and:[OSI::ROSE isLoaded]).
    self osiCMISEPresent value:(OSI::CMISE notNil and:[OSI::CMISE isLoaded]).
    self osiACSEPresent value ifTrue:[
        self osiACSEErrorLogging value:OSI::ACSE errorLogging.
        self osiACSEConnectionLogging value:OSI::ACSE connectionLogging.
        self osiACSEDataLogging value:OSI::ACSE dataLogging
    ].
    self osiROSEPresent value ifTrue:[
        self osiROSEErrorLogging value:OSI::ROSE errorLogging.
        self osiROSEInvokationLogging value:OSI::ROSE invocationLogging.
        self osiROSEResponseLogging value:OSI::ROSE responseLogging
    ].
    self osiCMISEPresent value ifTrue:[
        self osiCMISEErrorLogging value:OSI::CMISE errorLogging.
        self osiCMISEMessageLogging value:OSI::CMISE messageLogging
    ].
!

basicSaveSettings

    self osiACSEPresent value ifTrue:[
        OSI::ACSE errorLogging:self osiACSEErrorLogging value.
        OSI::ACSE connectionLogging:self osiACSEConnectionLogging value.
        OSI::ACSE dataLogging:self osiACSEDataLogging value.
    ].
    self osiROSEPresent value ifTrue:[
        OSI::ROSE errorLogging:self osiROSEErrorLogging value.
        OSI::ROSE invocationLogging:self osiROSEInvokationLogging value.
        OSI::ROSE responseLogging:self osiROSEResponseLogging value.
    ].
    self osiCMISEPresent value ifTrue:[
        OSI::CMISE errorLogging:self osiCMISEErrorLogging value.
        OSI::CMISE messageLogging:self osiCMISEMessageLogging value.
    ].
! !

!AbstractSettingsApplication::OsiSettingsAppl methodsFor:'aspects'!

osiACSEConnectionLogging
    osiACSEConnectionLogging isNil ifTrue:[
        osiACSEConnectionLogging := true asValue.
    ].
    ^ osiACSEConnectionLogging.
!

osiACSEDataLogging

    osiACSEDataLogging isNil ifTrue:[
        osiACSEDataLogging := true asValue.
    ].
    ^ osiACSEDataLogging.
!

osiACSEErrorLogging
    osiACSEErrorLogging isNil ifTrue:[
        osiACSEErrorLogging := true asValue.
    ].
    ^ osiACSEErrorLogging.
!

osiACSEPresent
    osiACSEPresent isNil ifTrue:[
        osiACSEPresent := true asValue.
    ].
    ^ osiACSEPresent.
!

osiCMISEErrorLogging
    osiCMISEErrorLogging isNil ifTrue:[
        osiCMISEErrorLogging := true asValue.
    ].
    ^ osiCMISEErrorLogging.
!

osiCMISEMessageLogging
    osiCMISEMessageLogging isNil ifTrue:[
        osiCMISEMessageLogging := true asValue.
    ].
    ^ osiCMISEMessageLogging.
!

osiCMISEPresent
    osiCMISEPresent isNil ifTrue:[
        osiCMISEPresent := true asValue.
    ].
    ^ osiCMISEPresent.
!

osiROSEErrorLogging
    osiROSEErrorLogging isNil ifTrue:[
        osiROSEErrorLogging := true asValue.
    ].
    ^ osiROSEErrorLogging.
!

osiROSEInvokationLogging
    osiROSEInvokationLogging isNil ifTrue:[
        osiROSEInvokationLogging := true asValue.
    ].
    ^ osiROSEInvokationLogging.
!

osiROSEPresent

    osiROSEPresent isNil ifTrue:[
        osiROSEPresent := true asValue.
    ].
    ^ osiROSEPresent.
!

osiROSEResponseLogging

    osiROSEResponseLogging isNil ifTrue:[
        osiROSEResponseLogging := true asValue.
    ].
    ^ osiROSEResponseLogging.
! !

!AbstractSettingsApplication::OsiSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/communicationsSettings.html'
! !

!AbstractSettingsApplication::OsiSettingsAppl methodsFor:'queries'!

hasUnsavedChanges

    ^ ((
        (self osiACSEPresent value and:[
        self osiACSEErrorLogging value ~= OSI::ACSE errorLogging or:[
        self osiACSEConnectionLogging value ~= OSI::ACSE connectionLogging or:[
        self osiACSEDataLogging value ~= OSI::ACSE dataLogging]]]) or:[
        self osiROSEPresent value and:[
            self osiROSEErrorLogging value ~= OSI::ROSE errorLogging or:[
            self osiROSEInvokationLogging value ~= OSI::ROSE invocationLogging or:[
            self osiROSEResponseLogging value ~= OSI::ROSE responseLogging]]]]) or:[
        (self osiCMISEPresent value) and:[
        self osiCMISEErrorLogging value ~= OSI::CMISE errorLogging or:[
        self osiCMISEMessageLogging value ~= OSI::CMISE messageLogging]]])
! !

!AbstractSettingsApplication::PrinterSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary printerIcon
! !

!AbstractSettingsApplication::PrinterSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::PrinterSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::PrinterSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::PrinterSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Printer Settings'
          name: 'Printer Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 616 385)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel1'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (ViewSpec
                    name: 'PrinterSelectBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Printer Type:'
                          name: 'PrinterTypeLabel'
                          layout: (LayoutFrame 0 0 5 0 181 0 27 0)
                          translateLabel: true
                          adjust: right
                        )
                       (ComboListSpec
                          name: 'PrinterTypeComboList'
                          layout: (LayoutFrame 183 0 5 0 -5 1 27 0)
                          model: printerTypeSelection
                          comboList: printerType
                          useIndex: true
                        )
                       (LabelSpec
                          label: 'Print Command:'
                          name: 'PrinterCommandLabel'
                          layout: (LayoutFrame 0 0 31 0 181 0 53 0)
                          visibilityChannel: printerIsDrivenByCommand
                          translateLabel: true
                          adjust: right
                        )
                       (ComboBoxSpec
                          name: 'CommandComboBox'
                          layout: (LayoutFrame 183 0 31 0 -5 1 53 0)
                          visibilityChannel: printerIsDrivenByCommand
                          enableChannel: printCommandEnabled
                          model: printCommand
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: false
                          comboList: printCommandList
                          useIndex: false
                        )
                       (LabelSpec
                          label: 'Print to File:'
                          name: 'PrinterFileLabel'
                          layout: (LayoutFrame 0 0 57 0 181 0 79 0)
                          visibilityChannel: printerSupportsPrintingToFile
                          translateLabel: true
                          adjust: right
                        )
                       (FilenameInputFieldSpec
                          name: 'PrinterFileEntryField'
                          layout: (LayoutFrame 183 0 57 0 -5 1 79 0)
                          visibilityChannel: printerSupportsPrintingToFile
                          model: printFilename
                          immediateAccept: true
                          acceptOnLeave: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: false
                        )
                       )
                     
                    )
                    extent: (Point 616 84)
                  )
                 (ViewSpec
                    name: 'FormatBox'
                    visibilityChannel: supportsPageFormatSetting
                    component: 
                   (SpecCollection
                      collection: (
                       (DividerSpec
                          name: 'Separator1'
                          layout: (LayoutFrame 0 0 0 0 0 1 3 0)
                        )
                       (LabelSpec
                          label: 'Page Format:'
                          name: 'PageFormatLabel'
                          layout: (LayoutFrame 0 0 7 0 181 0 29 0)
                          translateLabel: true
                          adjust: right
                        )
                       (PopUpListSpec
                          label: 'PopUp List'
                          name: 'PageFormatPopUpList'
                          layout: (LayoutFrame 183 0 7 0 333 0 29 0)
                          tabable: true
                          model: pageFormat
                          enableChannel: enableFormat
                          menu: pageFormatList
                        )
                       (CheckBoxSpec
                          label: 'Landscape'
                          name: 'LandscapeCheckBox'
                          layout: (LayoutFrame 380 0 7 0 -5 1 29 0)
                          enableChannel: enablelandscape
                          model: landscape
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 616 30)
                  )
                 (ViewSpec
                    name: 'MarginBox'
                    visibilityChannel: supportsMarginSetting
                    component: 
                   (SpecCollection
                      collection: (
                       (DividerSpec
                          name: 'Separator5'
                          layout: (LayoutFrame 0 0 0 0 0 1 3 0)
                        )
                       (VerticalPanelViewSpec
                          name: 'VerticalPanel2'
                          layout: (LayoutFrame 0 0.0 4 0.0 0 1.0 4 1.0)
                          horizontalLayout: fit
                          verticalLayout: center
                          horizontalSpace: 3
                          verticalSpace: 3
                          component: 
                         (SpecCollection
                            collection: (
                             (ViewSpec
                                name: 'Box1'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (LabelSpec
                                      label: 'Top Margin:'
                                      name: 'TopMarginLabel'
                                      layout: (LayoutFrame 0 0 0 0 181 0 21 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'TopMarginEntryField'
                                      layout: (LayoutFrame 183 0 0 0 283 0 21 0)
                                      enableChannel: enableMargins
                                      model: topMargin
                                      type: numberOrNil
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptOnPointerLeave: true
                                    )
                                   (PopUpListSpec
                                      label: 'PopUp List'
                                      name: 'PopUpList2'
                                      layout: (LayoutFrame -155 1 0 0 -5 1 21 0)
                                      tabable: true
                                      model: selectedUnit
                                      menu: unitList
                                      useIndex: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 616 24)
                              )
                             (ViewSpec
                                name: 'Box2'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (LabelSpec
                                      label: 'Left Margin:'
                                      name: 'LeftMarginLabel'
                                      layout: (LayoutFrame 0 0 0 0 181 0 21 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'LeftMarginEntryField'
                                      layout: (LayoutFrame 183 0 0 0 283 0 21 0)
                                      enableChannel: enableMargins
                                      model: leftMargin
                                      type: numberOrNil
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptOnPointerLeave: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 616 24)
                              )
                             (ViewSpec
                                name: 'Box3'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (LabelSpec
                                      label: 'Right Margin:'
                                      name: 'RightMarginLabel'
                                      layout: (LayoutFrame 0 0 0 0 181 0 21 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'RightMarginEntryField'
                                      layout: (LayoutFrame 183 0 0 0 283 0 21 0)
                                      enableChannel: enableMargins
                                      model: rightMargin
                                      type: numberOrNil
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptOnPointerLeave: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 616 24)
                              )
                             (ViewSpec
                                name: 'Box4'
                                component: 
                               (SpecCollection
                                  collection: (
                                   (LabelSpec
                                      label: 'Bottom Margin:'
                                      name: 'BottomMarginLabel'
                                      layout: (LayoutFrame 0 0 0 0 181 0 21 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'BottomMarginEntryField'
                                      layout: (LayoutFrame 183 0 0 0 283 0 21 0)
                                      enableChannel: enableMargins
                                      model: bottomMargin
                                      type: numberOrNil
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptOnPointerLeave: true
                                    )
                                   )
                                 
                                )
                                extent: (Point 616 24)
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                    extent: (Point 616 100)
                  )
                 (ViewSpec
                    name: 'ColorBox'
                    visibilityChannel: supportsColorSetting
                    component: 
                   (SpecCollection
                      collection: (
                       (DividerSpec
                          name: 'Separator6'
                          layout: (LayoutFrame 0 0 0 0 0 1 3 0)
                        )
                       (CheckBoxSpec
                          label: 'Color Printer'
                          name: 'ColorPrinterCheckBox'
                          layout: (LayoutFrame 183 0 4 0 782 0 25 0)
                          enableChannel: enableColorBox
                          model: supportsColor
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 616 27)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::PrinterSettingsAppl methodsFor:'actions'!

basicReadSettings
    Printer notNil ifTrue:[
        self 
            readAspects:
                #( 
                    topMargin
                    bottomMargin
                    leftMargin
                    rightMargin
                    landscape
                    printCommand
                    printFilename
                    supportsColor
                )
            from:Printer.
    ].

    self printerTypeSelection value:(self possiblePrinters identityIndexOf:Printer).
    self pageFormatList notEmpty ifTrue:[ self pageFormat value:Printer pageFormat ].
    self printerTypeSelectionOrUnitListChanged.

    "Modified: / 07-08-2006 / 15:22:27 / fm"
!

basicSaveSettings

    Printer := self possiblePrinters at:(self printerTypeSelection value).

    Printer printCommand:self printCommand value.
    Printer printFilename:(printFilename value isEmptyOrNil ifTrue:[nil] ifFalse:[printFilename value]).

    Printer supportsPageSizes ifTrue:[
        Printer pageFormat:(self pageFormat value).
        Printer landscape:(self landscape value).
    ].
    Printer supportsMargins ifTrue:[
        | unit |
        self selectedUnit value == 2 ifTrue:[
            unit := #mm
        ] ifFalse:[
            unit := #inch
        ].
        Printer topMargin:(UnitConverter convert:(self topMargin value) from:unit to:#inch).
        Printer leftMargin:(UnitConverter convert:(self leftMargin value) from:unit to:#inch).
        Printer rightMargin:(UnitConverter convert:(self rightMargin value) from:unit to:#inch).
        Printer bottomMargin:(UnitConverter convert:(self bottomMargin value) from:unit to:#inch).
    ].
    Printer supportsPostscript ifTrue:[
        Printer supportsColor:self supportsColor value.
    ].
! !

!AbstractSettingsApplication::PrinterSettingsAppl methodsFor:'aspects'!

bottomMargin

    bottomMargin isNil ifTrue:[
        bottomMargin := Printer bottomMargin asValue.
        bottomMargin onChangeSend:#updateModifiedChannel to:self
    ].
    ^ bottomMargin.
!

enableColorBox

    enableColorBox isNil ifTrue:[
        enableColorBox := true asValue.
    ].
    ^ enableColorBox.
!

enableFormat

    enableFormat isNil ifTrue:[
        enableFormat := true asValue.
    ].
    ^ enableFormat.
!

enableMargins

    enableMargins isNil ifTrue:[
        enableMargins := true asValue.
    ].
    ^ enableMargins.
!

enablelandscape

    enablelandscape isNil ifTrue:[
        enablelandscape := true asValue.
    ].
    ^ enablelandscape.
!

landscape

    landscape isNil ifTrue:[
        landscape := (Printer isNil ifTrue:[ false ] ifFalse:[ Printer landscape])  asValue.
        landscape onChangeSend:#updateModifiedChannel to:self
    ].
    ^ landscape.

    "Modified: / 07-08-2006 / 15:22:44 / fm"
!

leftMargin

    leftMargin isNil ifTrue:[
        leftMargin := Printer leftMargin asValue.
        leftMargin onChangeSend:#updateModifiedChannel to:self
    ].
    ^ leftMargin.
!

pageFormat

    pageFormat isNil ifTrue:[
        self pageFormatList notEmpty ifTrue:[
            | index |
            (index := self pageFormatList indexOf:#a4) ~~ 0 ifTrue:[
                pageFormat := index asValue.
            ] ifFalse:[
                pageFormat := 1 asValue.
            ]
        ].
        pageFormat onChangeSend:#updateModifiedChannel to:self
    ].
    ^ pageFormat.
!

pageFormatList

    pageFormatList isNil ifTrue:[
        pageFormatList := (Printer isNil ifTrue:[ #() ] ifFalse: [Printer defaultPageFormats]) asList.
    ].
    ^ pageFormatList.

    "Modified: / 07-08-2006 / 15:23:19 / fm"
!

printCommand

    printCommand isNil ifTrue:[
        printCommand := Printer printCommand asValue.
        printCommand onChangeSend:#updateModifiedChannel to:self
    ].
    ^ printCommand.
!

printCommandEnabled
    ^ BlockValue 
        with:[:m | m isEmptyOrNil]
        argument:(self printFilename).

    "Modified: / 08-03-2007 / 23:02:40 / cg"
!

printCommandList

    printCommandList isNil ifTrue:[
        printCommandList := self commandList asList.
    ].
    ^ printCommandList.
!

printFilename
    printFilename isNil ifTrue:[
        printFilename := (Printer isNil ifTrue:[''] ifFalse:[Printer printFilename ? '']) asValue.
        printFilename onChangeSend:#updateModifiedChannel to:self
    ].
    ^ printFilename.

    "Modified: / 07-08-2006 / 15:24:45 / fm"
!

printerIsDrivenByCommand
    printerIsDrivenByCommand isNil ifTrue:[
        printerIsDrivenByCommand := BlockValue
            with:[:m | 
                |printer|

                printer := self possiblePrinters at:m value ifAbsent:nil.
                printer notNil ifTrue:[
                    printer isDrivenByCommand
                ] ifFalse:[
                    self breakPoint:#expecco. 
                    false
                ]
            ] 
            argument:self printerTypeSelection.
    ].
    ^ printerIsDrivenByCommand.

    "Created: / 10-10-2006 / 18:22:32 / cg"
    "Modified: / 08-03-2007 / 23:02:44 / cg"
!

printerSupportsPrintingToFile
    printerSupportsPrintingToFile isNil ifTrue:[
        printerSupportsPrintingToFile := BlockValue
                                        with:[:m | (self possiblePrinters at:m) supportsPrintingToFile ] 
                                        argument:self printerTypeSelection.
    ].
    ^ printerSupportsPrintingToFile.

    "Created: / 10-10-2006 / 18:27:44 / cg"
    "Modified: / 08-03-2007 / 23:02:47 / cg"
!

printerType
    printerType isNil ifTrue:[
        printerType := (self possiblePrinters collect:[:cls | cls printerTypeName]) asList.
        printerType onChangeSend:#updateModifiedChannel to:self
    ].
    ^ printerType.

    "Modified: / 10-10-2006 / 18:09:43 / cg"
!

printerTypeSelection

    printerTypeSelection isNil ifTrue:[
        printerTypeSelection := (self possiblePrinters identityIndexOf:Printer) asValue.
        printerTypeSelection value == 0 ifTrue:[
            printerTypeSelection := (self possiblePrinters firstIfEmpty:[self error:'no printer']) asValue.
        ].

        printerTypeSelection addDependent:self.
        printerTypeSelection changed.
        printerTypeSelection onChangeSend:#updateModifiedChannel to:self
    ].
    ^ printerTypeSelection.

    "Modified: / 10-10-2006 / 18:22:58 / cg"
!

rightMargin

    rightMargin isNil ifTrue:[
        rightMargin := Printer rightMargin asValue.
        rightMargin onChangeSend:#updateModifiedChannel to:self
    ].
    ^ rightMargin.
!

selectedUnit

    selectedUnit isNil ifTrue:[
        selectedUnit := 1 asValue.
        selectedUnit addDependent:self.
        selectedUnit changed.
        selectedUnit onChangeSend:#updateModifiedChannel to:self
    ].
    ^ selectedUnit.
!

supportsColor

    supportsColor isNil ifTrue:[
        supportsColor := (Printer notNil and:[Printer supportsColor]) asValue.
        supportsColor onChangeSend:#updateModifiedChannel to:self
    ].
    ^ supportsColor.

    "Modified: / 07-08-2006 / 15:24:22 / fm"
!

supportsColorSetting
    supportsColorSetting isNil ifTrue:[
        supportsColorSetting := BlockValue
                                        with:[:m | (self possiblePrinters at:m) supportsColor ] 
                                        argument:self printerTypeSelection.
    ].
    ^ supportsColorSetting.

    "Created: / 10-10-2006 / 18:35:47 / cg"
    "Modified: / 08-03-2007 / 23:02:50 / cg"
!

supportsMarginSetting
    supportsMarginSetting isNil ifTrue:[
        supportsMarginSetting := BlockValue
                                        with:[:m | (self possiblePrinters at:m) supportsMargins ] 
                                        argument:self printerTypeSelection.
    ].
    ^ supportsMarginSetting.

    "Created: / 10-10-2006 / 18:35:33 / cg"
    "Modified: / 08-03-2007 / 23:02:54 / cg"
!

supportsPageFormatSetting
    supportsPageFormatSetting isNil ifTrue:[
        supportsPageFormatSetting := BlockValue
                                        with:[:m | (self possiblePrinters at:m) supportsPageSizes ] 
                                        argument:self printerTypeSelection.
    ].
    ^ supportsPageFormatSetting.

    "Created: / 10-10-2006 / 18:36:33 / cg"
    "Modified: / 08-03-2007 / 23:02:56 / cg"
!

topMargin

    topMargin isNil ifTrue:[
        topMargin := (Printer isNil ifTrue:[ 0 ] ifFalse:[ Printer topMargin ]) asValue.
        topMargin onChangeSend:#updateModifiedChannel to:self
    ].
    ^ topMargin.

    "Modified: / 07-08-2006 / 15:21:50 / fm"
!

unitList

    unitList isNil ifTrue:[
        unitList := #('inch' 'mm') asList.
    ].
    ^ unitList.
! !

!AbstractSettingsApplication::PrinterSettingsAppl methodsFor:'change & update'!

printerTypeSelectionChanged
    | p hasPageSize hasMargins|

    self printerType selectionIndex ~~ 0 ifTrue:[
        p := self possiblePrinters at:(self printerType selectionIndex).
        hasPageSize := p supportsPageSizes. 
        hasMargins := p supportsMargins. 
    ] ifFalse:[
        hasPageSize := false.
        hasMargins := false.
    ].
!

printerTypeSelectionOrUnitListChanged
    | p hasPageSize hasMargins unit printerSupportsPostscript|

    self printerTypeSelection value ~~ 0 ifTrue:[
        p := self possiblePrinters at:(self printerTypeSelection value).
        hasPageSize := p supportsPageSizes. 
        hasMargins := p supportsMargins. 
    ] ifFalse:[
        hasPageSize := false.
        hasMargins := false.
    ].
    self enablelandscape value:hasPageSize.
    self enableFormat value:hasPageSize.
    hasPageSize ifTrue:[
        self pageFormat value:(p pageFormat).
        self landscape value:(p landscape).
    ] ifFalse:[ 
       self landscape value:false.
    ].
    hasMargins ifTrue:[
       self selectedUnit value == 2 ifTrue:[
           unit := #mm
       ] ifFalse:[
           unit := #inch
       ].

       self topMargin value:(UnitConverter convert:p topMargin from:#inch to:unit).
       self leftMargin value:(UnitConverter convert:p leftMargin from:#inch to:unit).
       self rightMargin value:(UnitConverter convert:p rightMargin from:#inch to:unit).
       self bottomMargin value:(UnitConverter convert:p bottomMargin from:#inch to:unit).

    ] ifFalse:[ 
    ].
    self enableMargins value:hasMargins.

    p notNil ifTrue:[ 
        | newCommandList |
        newCommandList := p defaultCommands.
        newCommandList notNil ifTrue:[
            self printCommandList contents:(newCommandList asList).
            self printCommandList changed.
        ].
        self printCommand value:(p printCommand).
        self printFilename value:(p printFilename ? '').
    ].
    printerSupportsPostscript := p notNil and:[p supportsPostscript].
    self enableColorBox value:printerSupportsPostscript.
    printerSupportsPostscript ifFalse:[
        self supportsColor value:false
    ] ifTrue:[
        self supportsColor value:(Printer supportsColor).
    ]

    "Modified: / 07-08-2006 / 15:24:06 / fm"
!

unitListChanged
!

update:something with:aParameter from:changedObject
    (changedObject == self selectedUnit or:[changedObject == self printerTypeSelection]) ifTrue:[
        self printerTypeSelectionOrUnitListChanged.
        ^ self.
    ].

    super update:something with:aParameter from:changedObject
! !

!AbstractSettingsApplication::PrinterSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/printerSettings.html'
! !

!AbstractSettingsApplication::PrinterSettingsAppl methodsFor:'queries'!

commandList
    commandList isNil ifTrue:[
        commandList := resources string:'PRINT_COMMANDS' default:nil.
        commandList isNil ifTrue:[
            commandList := PrinterStream defaultCommands.
            commandList isNil ifTrue:[
                commandList := #('lpr' 'lp').
            ].
            (commandList includes:self printCommand value) ifFalse:[
                commandList := commandList copyWith:self printCommand value.
            ].
        ].
    ].
    ^ commandList
!

hasUnsavedChanges
    | printer unit|

    Printer isNil ifTrue:[^ false].

    self selectedUnit value == 2 ifTrue:[
        unit := #mm
    ] ifFalse:[
        unit := #inch
    ].
    printer := self possiblePrinters at:(self printerTypeSelection value).

    printer ~= Printer ifTrue:[^ true].

    Printer printCommand ~= self printCommand value ifTrue:[^ true].
    (Printer printFilename ? '') ~= (self printFilename value ? '') ifTrue:[^ true].

    Printer supportsPageSizes ifTrue:[
        Printer pageFormat ~= self pageFormat value ifTrue:[^ true].
        Printer landscape ~= (self landscape value) ifTrue:[^ true].
    ].
    Printer supportsMargins ifTrue:[
        Printer topMargin ~= ((UnitConverter convert:(self topMargin value asFloat) from:unit to:#inch) asFloat) ifTrue:[^ true].
        Printer leftMargin ~= ((UnitConverter convert:(self leftMargin value asFloat) from:unit to:#inch) asFloat) ifTrue:[^ true].
        Printer rightMargin ~= ((UnitConverter convert:(self rightMargin value asFloat) from:unit to:#inch) asFloat) ifTrue:[^ true].
        Printer bottomMargin ~= ((UnitConverter convert:(self bottomMargin value asFloat) from:unit to:#inch) asFloat) ifTrue:[^ true].
    ].
    Printer supportsPostscript ifTrue:[
        Printer supportsColor ~= self supportsColor value ifTrue:[^ true].
    ].
    ^ false

    "Modified: / 07-08-2006 / 15:25:47 / fm"
!

possiblePrinters
    possiblePrinters isNil ifTrue:[
        possiblePrinters := PrinterStream withAllSubclasses asArray.
    ].
    ^ possiblePrinters
! !

!AbstractSettingsApplication::ProcessorSchedulerSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::ProcessorSchedulerSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth4Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@@@@@@@ADQ@@@@@@@@@@DQBL2QD@@@@@@@DH"D3D"I@@@@@@DHQDSLQDRP@@@@DHQDQDQDQD$@@@DHQDQDQDQDQI@@@P!!DQDQDQDQD$@@AB
DQDQDQLQDRP@ABDQDQDQLQDQD$@DHQDQDSLQDQDRP@P!!DQDQL1DQDQI@ABDQDQDQLQDQD$@@P!!DQDQDSDQD$@@ABDQDQDQD1DRP@@DHQDQDQDQLQI@@@ABDQ
DQDQDQI@@@@@P!!DQDQDQI@@@@@@DH"DQD"I@@@@@@@ADP"H$Q@@@@@@@@@@DQD@@@@@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 255 255 128 128 128 0 128 128 192 192 192]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@G @@?<@A?>@C??@G?? O??0O??0O??0_??8_??8_??8_??8O??0O??0O??0G?? C??@A?>@@?<@@G @@@@@') ; yourself); yourself]
! !

!AbstractSettingsApplication::ProcessorSchedulerSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::ProcessorSchedulerSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::ProcessorSchedulerSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::ProcessorSchedulerSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Processor and Scheduler Settings'
          name: 'Processor and Scheduler Settings'
          min: (Point 10 10)
          bounds: (Rectangle 14 46 614 366)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: topSpace
              horizontalSpace: 3
              verticalSpace: 5
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Preemptive Scheduling'
                    name: 'CheckBox11'
                    model: preemptive
                    translateLabel: true
                    extent: (Point 600 22)
                  )
                 (ViewSpec
                    name: 'Box2'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Dynamic Priorities'
                          name: 'CheckBox12'
                          layout: (LayoutFrame 30 0.0 0 0 0 1.0 22 0)
                          enableChannel: preemptive
                          model: dynamicPrios
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 23)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::ProcessorSchedulerSettingsAppl methodsFor:'actions'!

basicReadSettings
    self preemptive value:Processor isTimeSlicing.
    self dynamicPrios value:Processor supportDynamicPriorities.
!

basicSaveSettings

    Processor isTimeSlicing ~~ self preemptive value ifTrue:[
        self preemptive value ifTrue:[
            Processor startTimeSlicing
        ] ifFalse:[
            Processor stopTimeSlicing
        ]
    ].
    Processor supportDynamicPriorities ~~ self dynamicPrios value ifTrue:[
        Processor supportDynamicPriorities:self dynamicPrios value
    ].
! !

!AbstractSettingsApplication::ProcessorSchedulerSettingsAppl methodsFor:'aspects'!

dynamicPrios
    dynamicPrios isNil ifTrue:[
        dynamicPrios := true asValue.
        dynamicPrios onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ dynamicPrios.
!

preemptive
    preemptive isNil ifTrue:[
        preemptive := true asValue.
        preemptive onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ preemptive.
! !

!AbstractSettingsApplication::ProcessorSchedulerSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/miscSettings.html'
! !

!AbstractSettingsApplication::ProcessorSchedulerSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    self preemptive value ~= Processor isTimeSlicing ifTrue:[^ true].
    self dynamicPrios value ~= Processor supportDynamicPriorities ifTrue:[^ true].
    ^ false
! !

!AbstractSettingsApplication::RDoItServerSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::RDoItServerSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth4Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@&Y&Y&Y&Y&Y3@@@BY&Y&Y&Y&Y''L@@@I$[]7_]7]6,1P@@&QL3L>:1GZ3E@@BY83L3L>D]+LT@@I
''#L3L38Q6,1P@@&[L3L8 @]7''E@@BYE3NH (@@_LT@@I$WNBBDAH L1P@@&Q]8P$IB"@3E@@BY4W $ B$@CLT@@L3L $!!H@$"@1P@@3L2DJB DJHCE@@@@UV
!!B D @A%T@@@@@BBP$IH @@@@@@@@HPHHB"@@@@@@@@@@@!!H@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 64 80 96 240 240 0 80 112 112 240 240 240 64 64 64 48 64 80 64 96 96 128 128 0 128 128 128 48 80 80 80 96 96 112 112 112 64 80 80 80 96 112]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@G??0G??0G??8G??8G??8G??8G??8G??8G??8G??8G??8G??8G??8A??8@O?@@O?@@G>@@A0@@@@@') ; yourself); yourself]
! !

!AbstractSettingsApplication::RDoItServerSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::RDoItServerSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::RDoItServerSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::RDoItServerSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'RDoIt Server Settings'
          name: 'RDoIt Server Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 600 550)
        )
        component: 
       (SpecCollection
          collection: (
           (FramedBoxSpec
              label: 'RDoIt'
              name: 'RDoItFramedBox'
              layout: (LayoutFrame 0 0 0 0 0 1 219 0)
              labelPosition: topLeft
              translateLabel: true
              component: 
             (SpecCollection
                collection: (
                 (VerticalPanelViewSpec
                    name: 'VerticalPanel2'
                    layout: (LayoutFrame 0 0.0 5 0.0 0 1.0 0 1.0)
                    horizontalLayout: fit
                    verticalLayout: top
                    horizontalSpace: 0
                    verticalSpace: 0
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Box1'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Remote doits enabled'
                                name: 'CheckBox1'
                                layout: (LayoutFrame 0 0 0 0 -5 1 22 0)
                                enableChannel: hasRDoitServerClass
                                model: rDoitsEnabled
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 25)
                        )
                       (ViewSpec
                          name: 'Box2'
                          component: 
                         (SpecCollection
                            collection: (
                             (LabelSpec
                                label: 'Port/Path:'
                                name: 'Label2'
                                layout: (LayoutFrame 0 0 0 0 150 0 22 0)
                                translateLabel: true
                                adjust: right
                              )
                             (InputFieldSpec
                                name: 'EntryField1'
                                layout: (LayoutFrame 150 0 0 0 -5 1 22 0)
                                enableChannel: rDoitsEnabled
                                model: rDoitServerPortOrPath
                                acceptOnReturn: true
                                acceptOnTab: true
                                acceptOnLostFocus: true
                                acceptOnPointerLeave: true
                              )
                             (LabelSpec
                                label: 'Port# for Tcp Socket; Path for Unix Domain Socket (Unix only).'
                                name: 'Label3'
                                layout: (LayoutFrame 150 0 28 0 596 0 50 0)
                                translateLabel: true
                                adjust: left
                              )
                             )
                           
                          )
                          extent: (Point 566 60)
                        )
                       (ViewSpec
                          name: 'Box13'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Local Connections Only'
                                name: 'CheckBox10'
                                layout: (LayoutFrame 150 0 0 0 -5 1 22 0)
                                enableChannel: rDoitsEnabled
                                model: rDoitEnabledOnlyViaLocalConnection
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 25)
                        )
                       (ViewSpec
                          name: 'Box3'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Log errors'
                                name: 'CheckBox2'
                                layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                                enableChannel: rDoitsEnabled
                                model: rDoitErrorLogging
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 25)
                        )
                       (ViewSpec
                          name: 'Box4'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Log requests'
                                name: 'CheckBox3'
                                layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                                enableChannel: rDoitsEnabled
                                model: rDoitLogging
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 24)
                        )
                       (ViewSpec
                          name: 'Box5'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Debug errors'
                                name: 'CheckBox4'
                                layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                                enableChannel: rDoitsEnabled
                                model: rDoitErrorDebugging
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 23)
                        )
                       )
                     
                    )
                  )
                 )
               
              )
            )
           (FramedBoxSpec
              label: 'JavaScript-Scripting via Telnet'
              name: 'ScriptingFramedBox'
              layout: (LayoutFrame 0 0 218 0 0 1 433 0)
              labelPosition: topLeft
              translateLabel: true
              component: 
             (SpecCollection
                collection: (
                 (VerticalPanelViewSpec
                    name: 'VerticalPanel3'
                    layout: (LayoutFrame 0 0.0 5 0.0 0 1.0 0 1.0)
                    horizontalLayout: fit
                    verticalLayout: top
                    horizontalSpace: 0
                    verticalSpace: 0
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Box6'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'JavaScript-Scripting enabled'
                                name: 'CheckBox5'
                                layout: (LayoutFrame 0 0 0 0 -5 1 22 0)
                                enableChannel: hasScriptingServerClass
                                model: scriptingEnabled
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 25)
                        )
                       (ViewSpec
                          name: 'Box12'
                          component: 
                         (SpecCollection
                            collection: (
                             (LabelSpec
                                label: 'Port:'
                                name: 'Label4'
                                layout: (LayoutFrame 0 0 0 0 150 0 22 0)
                                translateLabel: true
                                adjust: right
                              )
                             (InputFieldSpec
                                name: 'EntryField2'
                                layout: (LayoutFrame 150 0 0 0 -5 1 22 0)
                                enableChannel: rDoitsEnabled
                                model: scriptingServerPortOrPath
                                isReadOnly: true
                                acceptOnReturn: true
                                acceptOnTab: true
                                acceptOnLostFocus: true
                                acceptOnPointerLeave: true
                              )
                             (LabelSpec
                                label: 'Port# for Tcp Socket; Path for Unix Domain Socket (Unix only).'
                                name: 'Label5'
                                layout: (LayoutFrame 150 0 28 0 596 0 50 0)
                                initiallyInvisible: true
                                translateLabel: true
                                adjust: left
                              )
                             )
                           
                          )
                          extent: (Point 566 60)
                        )
                       (ViewSpec
                          name: 'Box11'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Local Connections Only'
                                name: 'CheckBox9'
                                layout: (LayoutFrame 150 0 0 0 -5 1 22 0)
                                enableChannel: scriptingEnabled
                                model: scriptingEnabledOnlyViaLocalConnection
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 25)
                        )
                       (ViewSpec
                          name: 'Box8'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Log errors'
                                name: 'CheckBox6'
                                layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                                enableChannel: scriptingEnabled
                                model: scriptingErrorLogging
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 25)
                        )
                       (ViewSpec
                          name: 'Box9'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Log requests'
                                name: 'CheckBox7'
                                layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                                enableChannel: scriptingEnabled
                                model: scriptingLogging
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 24)
                        )
                       (ViewSpec
                          name: 'Box10'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Debug errors'
                                name: 'CheckBox8'
                                layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                                enableChannel: scriptingEnabled
                                model: scriptingErrorDebugging
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 566 23)
                        )
                       )
                     
                    )
                  )
                 )
               
              )
            )
           )
         
        )
      )

    "Modified: / 20-05-2010 / 12:15:22 / cg"
! !

!AbstractSettingsApplication::RDoItServerSettingsAppl methodsFor:'actions'!

basicReadSettings
    |rDoitsEnabled rDoitLogging rDoitErrorLogging rDoitErrorDebugging rDoitServerPortOrPath
     rDoitEnabledOnlyViaLocalConnection
     scriptingEnabled scriptingEnabledOnlyViaLocalConnection scriptingLogging
     scriptingErrorLogging scriptingErrorDebugging|

    rDoitsEnabled := false.
    rDoitLogging := false. 
    rDoitErrorLogging := false.
    rDoitErrorDebugging := false.
    rDoitServerPortOrPath := ''.
    rDoitEnabledOnlyViaLocalConnection := true.

    scriptingEnabled := false.
    scriptingEnabledOnlyViaLocalConnection := true.

    (self hasRDoitServer and:[RDoItServer isLoaded]) ifTrue:[
        rDoitsEnabled := RDoItServer serverRunning.
        rDoitEnabledOnlyViaLocalConnection := RDoItServer localConnectionsOnly.
        rDoitLogging := RDoItServer isLogging.
        rDoitErrorLogging := RDoItServer isErrorLogging.
        rDoitErrorDebugging := RDoItServer isErrorCatching not.
        rDoitServerPortOrPath := RDoItServer defaultPortNumberOrPath asString.
    ].

    (STXScriptingServer notNil 
    and:[ STXScriptingServer isLoaded ]) ifTrue:[
        scriptingEnabled := STXScriptingServer serverRunning.
        scriptingEnabledOnlyViaLocalConnection := STXScriptingServer localConnectionsOnly.
        scriptingLogging := STXScriptingServer isLogging.
        scriptingErrorLogging := STXScriptingServer isErrorLogging.
        scriptingErrorDebugging := STXScriptingServer isErrorDebugging.
    ].

    self rDoitsEnabled value:rDoitsEnabled.
    self rDoitLogging value:rDoitLogging.
    self rDoitErrorLogging value:rDoitErrorLogging.
    self rDoitErrorDebugging value:rDoitErrorDebugging.
    self rDoitServerPortOrPath value:rDoitServerPortOrPath.

    self scriptingEnabled value:scriptingEnabled.
    self scriptingEnabledOnlyViaLocalConnection value:scriptingEnabledOnlyViaLocalConnection.
    self scriptingLogging value:scriptingLogging.
    self scriptingErrorLogging value:scriptingErrorLogging.
    self scriptingErrorDebugging value:scriptingErrorDebugging.

    "Modified: / 20-05-2010 / 14:49:50 / cg"
!

basicSaveSettings
    |shouldRun portOrPath|

    portOrPath := self getPortNumberOrPath.

    self hasRDoitServerClass ifTrue:[
        RDoItServer defaultPortNumberOrPath:portOrPath.
        RDoItServer logging:self rDoitLogging value.
        RDoItServer errorLogging:self rDoitErrorLogging value.
        RDoItServer errorCatching:(self rDoitErrorDebugging value not).
        RDoItServer localConnectionsOnly:(self rDoitEnabledOnlyViaLocalConnection value).
        shouldRun := self rDoitsEnabled value.
        shouldRun ~~ RDoItServer serverRunning ifTrue:[
            shouldRun ifFalse:[
                RDoItServer stop
            ] ifTrue:[
                RDoItServer start.
                "/ must wait a bit; give it a chance to
                "/ really start (before checking)
                Delay waitForSeconds:1.
                RDoItServer serverRunning ifFalse:[
                    self warn:'RDoit startup failed (see stderr).'
                ]
            ]
        ].
    ].

    self hasScriptingServerClass ifTrue:[
        STXScriptingServer logging:self scriptingLogging value.
        STXScriptingServer errorLogging:self scriptingErrorLogging value.
        STXScriptingServer errorDebugging:(self scriptingErrorDebugging value).
        STXScriptingServer localConnectionsOnly:(self scriptingEnabledOnlyViaLocalConnection value).
        shouldRun := self scriptingEnabled value.
        shouldRun ~~ STXScriptingServer serverRunning ifTrue:[
            shouldRun ifFalse:[
                STXScriptingServer stop
            ] ifTrue:[
                STXScriptingServer start.
                "/ must wait a bit; give it a chance to
                "/ really start (before checking)
                Delay waitForSeconds:1.
                STXScriptingServer serverRunning ifFalse:[
                    self warn:'STXScripting startup failed (see stderr).'
                ]
            ]
        ].
    ].

    "Modified: / 20-05-2010 / 14:50:44 / cg"
!

getPortNumberOrPath
    |portOrPath nrOrNil|

    portOrPath := self rDoitServerPortOrPath value.
    portOrPath isNumber ifFalse:[
        "a numeric string means it is a TCP port number"
        nrOrNil := Integer readFrom:portOrPath onError:nil.
        nrOrNil notNil ifTrue:[
            portOrPath := nrOrNil.
        ]
    ].
    ^ portOrPath
! !

!AbstractSettingsApplication::RDoItServerSettingsAppl methodsFor:'aspects'!

rDoitEnabledOnlyViaLocalConnection
    rDoitEnabledOnlyViaLocalConnection isNil ifTrue:[
        rDoitEnabledOnlyViaLocalConnection := true asValue.
        rDoitEnabledOnlyViaLocalConnection onChangeSend:#updateModifiedChannel to:self
    ].
    ^ rDoitEnabledOnlyViaLocalConnection.

    "Created: / 20-05-2010 / 12:15:12 / cg"
!

rDoitErrorDebugging
    rDoitErrorDebugging isNil ifTrue:[
        rDoitErrorDebugging := true asValue.
        rDoitErrorDebugging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ rDoitErrorDebugging.
!

rDoitErrorLogging
    rDoitErrorLogging isNil ifTrue:[
        rDoitErrorLogging := true asValue.
        rDoitErrorLogging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ rDoitErrorLogging.
!

rDoitLogging
    rDoitLogging isNil ifTrue:[
        rDoitLogging := true asValue.
        rDoitLogging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ rDoitLogging.
!

rDoitOnlyViaLocalConnection
    rDoitOnlyViaLocalConnection isNil ifTrue:[
        rDoitOnlyViaLocalConnection := true asValue.
        rDoitOnlyViaLocalConnection onChangeSend:#updateModifiedChannel to:self
    ].
    ^ rDoitOnlyViaLocalConnection.

    "Created: / 20-05-2010 / 12:14:50 / cg"
!

rDoitServerPortOrPath
    rDoitServerPortOrPath isNil ifTrue:[
        rDoitServerPortOrPath := nil asValue.
        rDoitServerPortOrPath onChangeSend:#updateModifiedChannel to:self
    ].
    ^ rDoitServerPortOrPath.
!

rDoitsEnabled
    rDoitsEnabled isNil ifTrue:[
        rDoitsEnabled := true asValue.
        rDoitsEnabled onChangeSend:#rDoitsEnabledChanged to:self
    ].
    ^ rDoitsEnabled.
!

scriptingEnabled
    scriptingEnabled isNil ifTrue:[
        scriptingEnabled := false asValue.
        scriptingEnabled onChangeSend:#updateModifiedChannel to:self
    ].
    ^ scriptingEnabled.
!

scriptingEnabledOnlyViaLocalConnection
    scriptingEnabledOnlyViaLocalConnection isNil ifTrue:[
        scriptingEnabledOnlyViaLocalConnection := true asValue.
        scriptingEnabledOnlyViaLocalConnection onChangeSend:#updateModifiedChannel to:self
    ].
    ^ scriptingEnabledOnlyViaLocalConnection.
!

scriptingErrorDebugging
    scriptingErrorDebugging isNil ifTrue:[
        scriptingErrorDebugging := true asValue.
        scriptingErrorDebugging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ scriptingErrorDebugging.
!

scriptingErrorLogging
    scriptingErrorLogging isNil ifTrue:[
        scriptingErrorLogging := true asValue.
        scriptingErrorLogging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ scriptingErrorLogging.
!

scriptingLogging
    scriptingLogging isNil ifTrue:[
        scriptingLogging := true asValue.
        scriptingLogging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ scriptingLogging.
!

scriptingServerPortOrPath
    <resource: #uiAspect>

    "automatically generated by UIPainter ..."

    "*** the code below creates a default model when invoked."
    "*** (which may not be the one you wanted)"
    "*** Please change as required and accept it in the browser."
    "*** (and replace this comment by something more useful ;-)"

    scriptingServerPortOrPath isNil ifTrue:[
        STXScriptingServer notNil ifTrue:[
            scriptingServerPortOrPath := STXScriptingServer defaultPortNumber asValue.
        ].
"/ if your app needs to be notified of changes, uncomment one of the lines below:
"/       scriptingServerPortOrPath addDependent:self.
"/       scriptingServerPortOrPath onChangeSend:#scriptingServerPortOrPathChanged to:self.
    ].
    ^ scriptingServerPortOrPath.
! !

!AbstractSettingsApplication::RDoItServerSettingsAppl methodsFor:'change & update'!

rDoitsEnabledChanged
    self updateModifiedChannel.
    self rDoitsEnabled value ifTrue:[
        RDoItServer autoload.
        rDoitServerPortOrPath value isEmptyOrNil ifTrue:[
            rDoitServerPortOrPath value:(RDoItServer defaultPortNumberOrPath asString)
        ]
    ]
! !

!AbstractSettingsApplication::RDoItServerSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/communicationsSettings.html'
! !

!AbstractSettingsApplication::RDoItServerSettingsAppl methodsFor:'queries'!

hasRDoitServer
    ^ RDoItServer notNil and:[RDoItServer isLoaded]
!

hasRDoitServerClass
    ^ RDoItServer notNil
!

hasScriptingServer
    ^ STXScriptingServer notNil and:[STXScriptingServer isLoaded]
!

hasScriptingServerClass
    ^ STXScriptingServer notNil
!

hasUnsavedChanges
    (self hasRDoitServer and:[RDoItServer isLoaded]) ifTrue:[
        self rDoitsEnabled value ~= RDoItServer serverRunning ifTrue:[^ true].
        RDoItServer serverRunning ifTrue:[
            self rDoitLogging value ~= RDoItServer isLogging ifTrue:[^ true].
            self rDoitErrorLogging value ~= RDoItServer isErrorLogging ifTrue:[^ true].
            self rDoitErrorDebugging value ~= RDoItServer isErrorCatching not ifTrue:[^ true].
            self getPortNumberOrPath ~= RDoItServer defaultPortNumberOrPath ifTrue:[^ true].
            self rDoitEnabledOnlyViaLocalConnection value ~= RDoItServer localConnectionsOnly ifTrue:[^ true].
        ]
    ].
    (self hasScriptingServer and:[STXScriptingServer isLoaded]) ifTrue:[
        self scriptingEnabled value ~= STXScriptingServer serverRunning ifTrue:[^ true].
        STXScriptingServer serverRunning ifTrue:[
            self scriptingLogging value ~= STXScriptingServer isLogging ifTrue:[^ true].
            self scriptingErrorLogging value ~= STXScriptingServer isErrorLogging ifTrue:[^ true].
            self scriptingErrorDebugging value ~= STXScriptingServer isErrorDebugging ifTrue:[^ true].
            self scriptingEnabledOnlyViaLocalConnection value ~= STXScriptingServer localConnectionsOnly ifTrue:[^ true].
        ]
    ].
    ^ false

    "Modified: / 20-05-2010 / 14:48:52 / cg"
! !

!AbstractSettingsApplication::SQLServerSettingsAppl class methodsFor:'image specs'!

dbIcon1
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self dbIcon1 inspect
     ImageEditor openOnClass:self andSelector:#dbIcon1
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::SQLServerSettingsAppl class dbIcon1'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
H"H"H @@@@@@@@@@@@@@@@@@@@@"H"H"@@@@@@@@@@@@@@@@@@@@@@@@@@@"H"H"@@@@@@@@@@@@@@@@@@@@@@@@@@@@@BH"@@@@@@@@@@@@J"(*J"(*@@@@
@@@@@BH"@@@@@@@@J"(*@@@@@@@@J"(*@@@@H"H"@@@@@B(*@@@@@@@@@@@@@@@@J"("H"H"@@@@J @@@@@@@@@@@@@@@@@@@@@*H"H"@BH@H"(*@@@@@@@@
@@@@@@@@J"("H"H"@BH(H" $J"(*J @@@@@*J"(*H"H"H"H"@BH(H" $ABTJIB(*J"("H"H"H"H"H"H"@BH(H" $ABT%IBP(JBH"H"H"H"H"H"H"@@@(J" $
A@PDIBP(JBH"H"H"H"H*H"H"@BH@H"(*IBP$IBP(JBH"H"H"J"("H"H"@BH(H" $J"(*J"P(JBH*J"(*H"H"H"H"@BH(H" $ABTJIB(*J"("H"H"H"H"H"H"
@BH(H" $ABT%IBP(JBH"H"H"H"H"H"H"@@@(J" $A@PDIBP(JBH"H"H"H"H*H"H"@@@@@B(*IBP$IBP(JBH"H"H"J"(@H"H"H"H"H"H"J"(*IBP(JBH"J"(*
H"H"H"H"H"H"H"H"@@@@J"(*J"(*@@@@@@@@@BH"H"H"H"H"@@@@@@@@@@@@@@@@@@@@@BH"H"H"H"H"@@@@@@@@@@@@@@@@@@@@@BH"H"H"H"H"@@@@@@@@
@@@@@@@@@@@@@BH"H"H"H"H"@@@@@@@@@@@@@@@@@@@@@BH"') ; colorMapFromArray:#[224 189 75 255 253 212 114 169 125 244 219 172 224 180 55 105 195 48 255 253 194 253 210 112 27 163 14 139 188 141 254 253 153 67 140 42 245 230 190 245 250 242 238 222 158 240 212 96 254 253 228 249 239 209 254 233 132 135 224 88 62 138 68 241 209 144 254 198 97 148 180 81 255 227 154 39 125 38 61 166 37 216 172 46 46 153 24 113 206 71 25 131 15 240 198 86 79 187 37 254 243 141 102 77 2 69 123 9 205 154 5 249 235 113 225 193 100 218 179 65 130 98 3 10 113 5 0 0 0]; mask:((Depth1Image new) width: 24; height: 24; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@G8@@??@C??0G??8G??8G??8G??8G??8G??8G??8G??8G??8G??8G??8C??0@??@@G8@@@@@@@@@@@@@@@@@') ; yourself); yourself]
!

dbIcon2
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self dbIcon2 inspect
     ImageEditor openOnClass:self andSelector:#dbIcon2
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'Object class dbIcon2'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@
@@@@@@@@@@@@@@@@@@@@!!!!"O_@T>@@@@@@@@@@@@@@@@@@@@@E8=X(!!#T!!0-X@D@@@@@@@@@@@@@@@@@NVTLL@.HK%MTZQEH@@@@@@@@@@@@@@@@V2<LCC@K
"GTIT15UV @@@@@@@@@@@@@@R"$<F&P0B8]ONGECQ @@@@@@@@@@@@@@I!!,_]"2ARPH%J&!!8V@@@@@@@@@@@@@@@_1-EI61''PFFC!!F!!&V@@@@@@@@@@@@@@@
Z7QEI61''PFFC!!H.IV@@@@@@@@@@@@@@@\#Q3CRI''PB-.ICD:Q @@@@@@@@@@@@@@@EDH!!T4P^'',3EBA9# @@@@@@@@@@@@@@[Q-EI61''PFFC!!F!!VZ @@@@@@
@@@@@@@@M1-EI61''PFFC!!F ^V@@@@@@@@@@@@@@@_S=EI61''PFFC!!DQBV@@@@@@@@@@@@@@@B <GL%%''PA%]D 9P# @@@@@@@@@@@@@@@D\FM#VJ]84#S$EW
W@@@@@@@@@@@@@@@@@B@_$X!!#H0!!Q'':@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@
@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@') ; colorMapFromArray:#[219 185 65 198 168 74 219 190 79 243 243 243 247 247 247 212 188 103 224 198 109 222 200 122 234 215 144 254 223 141 240 223 165 253 234 173 253 237 183 241 231 193 188 151 42 211 174 48 191 161 59 254 242 210 208 176 66 242 239 229 220 189 76 242 242 242 245 245 245 255 255 255 222 198 111 244 220 117 237 216 141 255 233 149 254 227 155 250 228 170 196 152 26 252 239 190 253 238 192 212 212 212 249 242 210 207 171 55 211 178 65 225 194 72 230 197 74 255 251 236 250 248 244 231 203 98 246 219 105 245 221 117 227 210 143 241 216 146 253 228 154 249 232 171 253 237 182 174 139 37 239 228 192 202 168 50 209 174 52 210 173 51 214 179 60 222 188 68 210 174 70 224 193 81 208 180 89 254 254 254 225 200 105 232 208 118 220 202 138 252 229 143 252 235 160 205 200 181 186 147 30 202 156 27 251 235 189 255 244 201 216 216 216 233 228 211 193 161 65 207 177 72 230 197 73 252 249 237 252 251 244 208 183 100 213 188 101 231 202 112 206 189 131 252 230 145 254 225 148 254 228 160 254 233 176 187 149 35 198 153 27 211 211 211 215 215 215 248 241 209 225 225 225 223 192 70 231 231 231 231 201 81 225 195 86 253 253 253 219 192 114 251 228 125 243 221 145 253 226 149 247 229 168 252 236 180 201 155 26 253 243 195 255 240 196 255 239 199 217 217 217 220 185 61 254 249 224 223 188 69 232 203 81 244 244 244 252 252 252 211 183 100 236 208 111 227 205 125 252 230 144 253 226 148 236 222 171 197 156 25 202 156 26 190 149 32 187 154 48 197 165 54 203 172 59 215 179 59 224 224 224 228 196 72 236 236 236 210 184 89 249 249 249 250 223 100 251 225 111 217 194 122 233 215 148 246 222 149 253 230 161 186 145 25 200 158 27 251 236 189 209 209 209 205 168 48 218 218 218 208 177 64]; mask:((Depth1Image new) width: 24; height: 24; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@@@@@G8@@_>@@??@@?? @?? @?? @?? @?? @?? @?? @?? @?? @?? @?? @_? @O?@@@@@@@@@@@@@@@@@') ; yourself); yourself]
!

defaultIcon
    <resource: #programImage>

    "/ ^ self dbIcon1.
    ^ self dbIcon2.
! !

!AbstractSettingsApplication::SQLServerSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::SQLServerSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::SQLServerSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::SQLServerSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'SQL Server Settings'
          name: 'SQL Server Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 600 550)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (ViewSpec
                    name: 'EnableBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'SQL Server Enabled'
                          name: 'EnableCheckBox'
                          layout: (LayoutFrame 5 0 0 0 -5 1 22 0)
                          enableChannel: hasSQLServerClass
                          model: sqlServerEnabled
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 25)
                  )
                 (ViewSpec
                    name: 'PortBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'MySQL Port:'
                          name: 'Label2'
                          layout: (LayoutFrame 5 0 0 0 150 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField1'
                          layout: (LayoutFrame 150 0 0 0 -5 1 22 0)
                          enableChannel: sqlServerEnabled
                          model: sqlServerPort
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'MySQL Port-Number (ODBC)'
                          name: 'Label3'
                          layout: (LayoutFrame 150 0 28 0 596 0 50 0)
                          translateLabel: true
                          adjust: left
                        )
                       )
                     
                    )
                    extent: (Point 600 72)
                  )
                 (ViewSpec
                    name: 'LogErrorsBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Errors'
                          name: 'ErrorLoggingCheckBox'
                          layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                          enableChannel: sqlServerEnabled
                          model: sqlErrorLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 25)
                  )
                 (ViewSpec
                    name: 'LogDataBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Data'
                          name: 'LogDataCheckBox'
                          layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                          enableChannel: sqlServerEnabled
                          model: sqlDataLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 23)
                  )
                 (ViewSpec
                    name: 'LogRequestsBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log Requests'
                          name: 'LogRequestsCheckBox'
                          layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                          enableChannel: sqlServerEnabled
                          model: sqlLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 24)
                  )
                 (ViewSpec
                    name: 'LogSQLBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Log SQL'
                          name: 'CheckBox1'
                          layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                          enableChannel: sqlServerEnabled
                          model: sqlStatementLogging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 24)
                  )
                 (ViewSpec
                    name: 'DebugErrorsBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Debug Errors'
                          name: 'DebugErrorsCheckBox'
                          layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                          enableChannel: sqlServerEnabled
                          model: sqlErrorDebugging
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 23)
                  )
                 (ViewSpec
                    name: 'Box1'
                    extent: (Point 600 10)
                  )
                 (ViewSpec
                    name: 'EnableSmalltalkBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Virtual Smalltalk Tables Enabled'
                          name: 'EnableSmalltalkCheckBox'
                          layout: (LayoutFrame 25 0 0 0 -5 1 22 0)
                          enableChannel: sqlServerEnabled
                          model: sqlSmalltalkServerEnabled
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 600 24)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::SQLServerSettingsAppl methodsFor:'actions'!

basicReadSettings
    |sqlServerClass|

    sqlServerClass := self sqlServerClass.
    (sqlServerClass notNil and:[sqlServerClass isLoaded]) ifTrue:[
        self sqlServerEnabled value:sqlServerClass serverRunning.
        self sqlSmalltalkServerEnabled value:sqlServerClass isSmalltalkServerEnabled.
        self sqlLogging value:sqlServerClass isLogging.
        self sqlStatementLogging value:sqlServerClass isSQLLogging.
        self sqlErrorLogging value:sqlServerClass isErrorLogging.
        self sqlDataLogging value:sqlServerClass isDataLogging.
        self sqlErrorDebugging value:sqlServerClass isErrorCatching not.
        self sqlServerPort value:sqlServerClass defaultPort
    ] ifFalse:[
        self sqlServerEnabled value:false.
        self sqlSmalltalkServerEnabled value:false.
        self sqlLogging value:false.
        self sqlStatementLogging value:false.
        self sqlErrorLogging value:false.
        self sqlDataLogging value:false.
        self sqlErrorDebugging value:false.
        self sqlServerPort value:nil
    ].

    "Modified: / 25-01-2007 / 17:40:53 / cg"
!

basicSaveSettings
    |sqlServerClass shouldRun port|

    sqlServerClass := self sqlServerClass.

    port := self sqlServerPort value.
    port isNumber ifFalse:[
        port := port asInteger.
    ].

    sqlServerClass defaultPort:port.
    sqlServerClass logging:self sqlLogging value.
    sqlServerClass sqlLogging:self sqlStatementLogging value.
    sqlServerClass errorLogging:self sqlErrorLogging value.
    sqlServerClass dataLogging:self sqlDataLogging value.
    sqlServerClass errorCatching:(self sqlErrorDebugging value not).
    sqlServerClass smalltalkServerEnabled:(self sqlSmalltalkServerEnabled value).

    shouldRun := self sqlServerEnabled value.
    shouldRun ~~ sqlServerClass serverRunning ifTrue:[
        shouldRun ifFalse:[
            sqlServerClass stop
        ] ifTrue:[
            sqlServerClass start.
            "/ must wait a bit; give it a chance to
            "/ really start (before checking)
            Delay waitForSeconds:1.
            sqlServerClass serverRunning ifFalse:[
                self warn:'SQLServer startup failed (see stderr).'
            ]
        ]
    ].

    "Modified: / 25-01-2007 / 17:41:20 / cg"
! !

!AbstractSettingsApplication::SQLServerSettingsAppl methodsFor:'aspects'!

sqlDataLogging
    sqlDataLogging isNil ifTrue:[
        sqlDataLogging := true asValue.
        sqlDataLogging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ sqlDataLogging.
!

sqlErrorDebugging
    sqlErrorDebugging isNil ifTrue:[
        sqlErrorDebugging := true asValue.
        sqlErrorDebugging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ sqlErrorDebugging.
!

sqlErrorLogging
    sqlErrorLogging isNil ifTrue:[
        sqlErrorLogging := true asValue.
        sqlErrorLogging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ sqlErrorLogging.
!

sqlLogging
    sqlLogging isNil ifTrue:[
        sqlLogging := true asValue.
        sqlLogging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ sqlLogging.
!

sqlServerEnabled
    sqlServerEnabled isNil ifTrue:[
        sqlServerEnabled := true asValue.
        sqlServerEnabled onChangeSend:#sqlServerEnabledChanged to:self
    ].
    ^ sqlServerEnabled.
!

sqlServerPort
    sqlServerPort isNil ifTrue:[
        sqlServerPort := ValueHolder new.
        sqlServerPort onChangeSend:#updateModifiedChannel to:self
    ].
    ^ sqlServerPort.
!

sqlSmalltalkServerEnabled
    sqlSmalltalkServerEnabled isNil ifTrue:[
        sqlSmalltalkServerEnabled := true asValue.
        sqlSmalltalkServerEnabled onChangeSend:#sqlSmalltalkServerEnabledChanged to:self
    ].
    ^ sqlSmalltalkServerEnabled.
!

sqlStatementLogging
    sqlStatementLogging isNil ifTrue:[
        sqlStatementLogging := true asValue.
        sqlStatementLogging onChangeSend:#updateModifiedChannel to:self
    ].
    ^ sqlStatementLogging.
! !

!AbstractSettingsApplication::SQLServerSettingsAppl methodsFor:'change & update'!

sqlServerEnabledChanged
    self updateModifiedChannel.
    self sqlServerEnabled value ifTrue:[
        sqlServerPort value isEmptyOrNil ifTrue:[
            sqlServerPort value:(self sqlServerClass defaultPort)
        ]
    ]

    "Modified: / 25-01-2007 / 17:46:07 / cg"
!

sqlSmalltalkServerEnabledChanged
    self updateModifiedChannel.
    self sqlSmalltalkServerEnabled value ifTrue:[
        sqlServerPort value isEmptyOrNil ifTrue:[
            sqlServerPort value:(self sqlServerClass defaultPort)
        ]
    ]

    "Modified: / 25-01-2007 / 17:40:03 / cg"
! !

!AbstractSettingsApplication::SQLServerSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/communicationsSettings.html'
! !

!AbstractSettingsApplication::SQLServerSettingsAppl methodsFor:'queries'!

hasSQLServerClass
    ^ self sqlServerClass notNil

    "Created: / 25-01-2007 / 17:45:54 / cg"
!

hasUnsavedChanges
    |sqlServerClass|

    sqlServerClass := self sqlServerClass.
    (sqlServerClass notNil and:[sqlServerClass isLoaded]) ifFalse:[^ false ].

    self sqlServerEnabled value ~= sqlServerClass serverRunning ifTrue:[^ true].
    sqlServerClass serverRunning ifTrue:[
        self sqlSmalltalkServerEnabled value ~= sqlServerClass isSmalltalkServerEnabled ifTrue:[^ true].
        self sqlLogging value ~= sqlServerClass isLogging ifTrue:[^ true].
        self sqlStatementLogging value ~= sqlServerClass isSQLLogging ifTrue:[^ true].
        self sqlErrorLogging value ~= sqlServerClass isErrorLogging ifTrue:[^ true].
        self sqlDataLogging value ~= sqlServerClass isDataLogging ifTrue:[^ true].
        self sqlErrorDebugging value ~= sqlServerClass isErrorCatching not ifTrue:[^ true].
        self sqlServerPort value ~= sqlServerClass defaultPort ifTrue:[^ true].
    ].
    ^ false

    "Modified: / 25-01-2007 / 17:47:32 / cg"
!

sqlServerClass
    ^ SQLServer::SQLServer

    "Created: / 25-01-2007 / 17:29:59 / cg"
! !

!AbstractSettingsApplication::STCCompilerSettingsAppl class methodsFor:'defaults'!

stcCompilationOptions
    ^ #(default never)
!

stcCompilationStrings

    ^ #('primitive code only' 'never')
! !

!AbstractSettingsApplication::STCCompilerSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ self defaultIcon4

    "Modified: / 17-09-2007 / 11:35:12 / cg"
!

defaultIcon1
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon1 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon1
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::STCCompilerSettingsAppl class defaultIcon1'
        ifAbsentPut:[(Depth2Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#[2]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@C??????@CUUUUUW@CZ(J@B''@CZ""(*''CCZ"*(*''@CV(J(*WKCV*"(*W@CU""()WJCU(J()W@CUZ**%W@CUZ**%WACUV(JUW@CUV""UWDCUU")UWI
CUU")UWICUUR%UWJCUUR!!UWACUUTEUW@CUUUUUW@C??????@@@@@@@@B') ; colorMapFromArray:#[0 0 0 255 255 255 255 189 23 127 127 127]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8O??8@@@@') ; yourself); yourself]
!

defaultIcon2
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon2 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon2
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::STCCompilerSettingsAppl class defaultIcon2'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD@0LDA@PDA@PDA@PDA@PDA@PD
A@PDA@LCA PCA@P@@@@@@@@@@@@@@@@@@@@D@0PFA PCA@PC@0@@@@@@@@@@@@@C@0@D@0PFAPTD@0LDA L@@@@@@@@@@@LFA@LCA@TEAPTEA@PE@PL@@@@@
@@@@@@LAAPPDAPTEAPTEAPTF@0@@@@@@@@@@@@@CA TEAPTEA DFAPTD@0@@@@@@@@@@@@@CA@TEA DF@0LAA TEA@LC@@@@@@@@@0LDAPTF@PLC@ HC@PTE
APPD@0@@@@@CA@PEAPTA@0HB@ HCA TEAPDA@0@@@@@C@PDEAPTF@0HB@0LDAPTFA LC@@@@@@@@@0LFA TEA@LCA@PEAPTF@0PD@@@@@@@@@@PCA TEAPPD
APTEAPTD@0PDA@@@@@@@A@PCA@TEAPTEAPTEA DEA@LDA@@@@@@@A@LDAPDFAPTEAPTD@0LAA LDA@P@@@@DA@LF@PLCA@TE@PPCA@PC@0PDA@P@@@@DA@PC
@0PD@0PA@PPCA@PDA@PDA@PD@@PDA@PDA@PD@0PA@0LDA@PDA@PDA@PDA@PDA@PDA@PDA@LCA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD') ; colorMapFromArray:#[255 189 23 127 127 127 236 233 216 0 0 0 255 255 255 194 194 194 161 161 165]; yourself]
!

defaultIcon3
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon3 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon3
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::STCCompilerSettingsAppl class defaultIcon3'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PD
A@PDA@PDA@PDA@PDA@PDA@LDA LDA@PDA@PDA@PDA@PDA@PD@0LDA@LDA LDA@LCA@PDA@PDA@PDA@PCA PC@0PEAPPC@0PF@0PDA@PDA@PDA@PC@PTDA@TE
APTDA@TA@0PDA@PDA@PDA@PD@0XEAPTEAPTEAPXCA@PDA@PDA@PDA@PD@0PEAPXAA XEAPPCA@PDA@PDA@PDA@LCA@TEA DC@0DFAPTD@0LDA@PDA@PD@0PD
APTE@PLB@ LAAPTEA@PCA@P@A@PD@0DAAPTEA LB@ LFAPTE@PDCA@P@A@PDA@LCA XEAPPC@0PEAPXF@0LDA@PDA@PDA@PD@0XEAPTDA@TEAPXCA@PDA@PD
A@PDA@PD@0PEAPTEAPTEAPPCA@PDA@PDA@PDA@PCA@TAA TEAPTF@PTD@0PDA@PDA@PDA@PCA DC@0PEAPPC@0DF@0PDA@PDA@PDA@PD@0LDA@LD@PLDA@LC
A@PDA@PDA@PDA@PDA@PDA@LD@PLDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PD') ; colorMapFromArray:#[255 189 23 127 127 127 236 233 216 0 0 0 255 255 255 194 194 194 161 161 165]; mask:((Depth1Image new) width: 24; height: 24; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@A @@C0@@33@A?? A?? @??@@??@C??0G??8G??8C??0@??@@??@A?? A?? @33@@C0@@A @@@@@@@@@@@@@') ; yourself); yourself]
!

defaultIcon4
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon4 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon4
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::STCCompilerSettingsAppl class defaultIcon4'
        ifAbsentPut:[(Depth8Image new) width: 24; height: 24; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
A@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PDA@PC@0PDA@PD
A@PDA@PDA@PDA@PDA@PDA@LDA LDA@PDA@PDA@PDA@PDA@PD@0LDA@LDA LDA@LCA@PDA@PDA@PDA@PCA PC@0PEAPPC@0PF@0PDA@PDA@PDA@PC@PTDA@TE
APTDA@TA@0PDA@PDA@PDA@PD@0XEAPTEAPTEAPXCA@PDA@PDA@PDA@PD@0PEAPXAA XEAPPCA@PDA@PDA@PDA@LCA@TEA DC@0DFAPTD@0LDA@PDA@PD@0PD
APTE@PLB@ LAAPTEA@PCA@P@A@PD@0DAAPTEA LB@ LFAPTE@PDCA@P@A@PDA@LCA XEAPPC@0PEAPXF@0LDA@PDA@PDA@PD@0XEAPTDA@TEAPXCA@PDA@PD
A@PDA@PD@0PEAPTEAPTEAPPCA@PDA@PDA@PDA@PCA@TAA TEAPTF@PTD@0PDA@PDA@PDA@PCA DC@0PEAPPC@0DF@0PDA@PDA@PD@@PD@0LDA@LD@PLDA@LC
A@PDA@PDA@PC@0PDA@PDA@LD@PLDA@PDA@PC@0PDA@PCA@PDA@PDA@PC@0PDA@PDA@PD@0PDA@LDA@PDA@PDA@PDA@PDA@PDA@PDA@LDA@PCA@PD@0LD@0LD
@@LC@@LCA@PD@0PDA@PC@0PDA@PDA@PDA@PDA@PDA@PC@0PD') ; colorMapFromArray:#[255 189 23 127 127 127 236 233 216 0 0 0 255 255 255 194 194 194 161 161 165]; mask:((Depth1Image new) width: 24; height: 24; photometric:(#blackIs0); bitsPerSample:(#[1]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@A @@C0@@33@A?? A?? @??@@??@C??0G??8G??8C??0@??@@??@A?? A?? @33@LC0LHA DP@@BH6[DL@@L') ; yourself); yourself]
! !

!AbstractSettingsApplication::STCCompilerSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::STCCompilerSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::STCCompilerSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::STCCompilerSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'STC Compiler Settings'
          name: 'STC Compiler Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 600 478)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (ViewSpec
                    name: 'SeparatingBox12'
                    extent: (Point 600 4)
                  )
                 (ViewSpec
                    name: 'STCCompilationBox11'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'STC Compilation to Machine Code:'
                          name: 'Label11'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (PopUpListSpec
                          label: 'PopUp List'
                          name: 'StcCompilation'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          tabable: true
                          model: stcCompilationSelection
                          enableChannel: canLoadBinaries
                          menu: stcCompilationList
                          useIndex: true
                        )
                       )
                     
                    )
                    extent: (Point 600 29)
                  )
                 (ViewSpec
                    name: 'STCCommandBox1'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'STC Command:'
                          name: 'Label1'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField1'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: stc
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 35)
                  )
                 (ViewSpec
                    name: 'STCOptionsBox2'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'STC Options:'
                          name: 'Label2'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField2'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: stcOptions
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 35)
                  )
                 (ViewSpec
                    name: 'CCCommandBox3'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'CC Command:'
                          name: 'Label3'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField3'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: cc
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 35)
                  )
                 (ViewSpec
                    name: 'CCOptionsBox4'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'CC Options:'
                          name: 'Label4'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField4'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: ccOptions
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 35)
                  )
                 (ViewSpec
                    name: 'IncludeDirectoriesBox5'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Include Directories:'
                          name: 'Label5'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField5'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: stcIncludes
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 35)
                  )
                 (ViewSpec
                    name: 'STCDefinesBox6'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Defines:'
                          name: 'Label6'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField6'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: stcDefines
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 34)
                  )
                 (ViewSpec
                    name: 'LinkCommandBox7'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Link Command:'
                          name: 'Label7'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField7'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: linkCommand
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 33)
                  )
                 (ViewSpec
                    name: 'LinkArgumentsBox8'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Link Arguments:'
                          name: 'Label8'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField8'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: linkArgs
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 32)
                  )
                 (ViewSpec
                    name: 'LinkSharedArgumentsBox1'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Link Shared Arguments:'
                          name: 'Label12'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField11'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: linkSharedArgs
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 31)
                  )
                 (ViewSpec
                    name: 'CLibrariesBox9'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'C-Libraries:'
                          name: 'Label9'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField9'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: canLoadBinaries
                          model: stcLibraries
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 31)
                  )
                 (ViewSpec
                    name: 'STCLibraryPathBox10'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'STC Library Path:'
                          name: 'Label10'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField10'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          enableChannel: enableStcLibraryPath
                          model: stcLibraryPath
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 30)
                  )
                 (ViewSpec
                    name: 'MakeCommandBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Make Command:'
                          name: 'Label13'
                          layout: (LayoutFrame 0 0 0 0 200 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (InputFieldSpec
                          name: 'EntryField12'
                          layout: (LayoutFrame 201 0 0 0 -5 1 22 0)
                          model: makeCommand
                          acceptOnLeave: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          acceptOnPointerLeave: true
                        )
                       )
                     
                    )
                    extent: (Point 600 29)
                  )
                 )
               
              )
            )
           )
         
        )
      )

    "Modified: / 09-08-2006 / 19:31:38 / fm"
! !

!AbstractSettingsApplication::STCCompilerSettingsAppl methodsFor:'actions'!

basicReadSettings
    |t|

    self canLoadBinaries 
        value:(ObjectFileLoader notNil and:[ObjectFileLoader canLoadObjectFiles]).

    self stcIncludes value:ParserFlags stcCompilationIncludes.
    self stcDefines value:ParserFlags stcCompilationDefines.
    self stcOptions value:ParserFlags stcCompilationOptions.
    self ccOptions value:ParserFlags ccCompilationOptions.
    self cc value:ParserFlags ccPath.
    self stc value:ParserFlags stcPath.
    self makeCommand value:ParserFlags makeCommand.

    self linkCommand value:ParserFlags linkCommand.
    self linkArgs value:ParserFlags linkArgs.
    self linkSharedArgs value:ParserFlags linkSharedArgs.

    (t := ParserFlags searchedLibraries) notNil ifTrue:[
        self stcLibraries value:(String fromStringCollection:t separatedBy:' ')
    ].
    (t := ParserFlags libPath) notNil ifTrue:[
        self stcLibraryPath value:t
    ].

    self stcCompilationSelection value:(self class stcCompilationOptions 
             indexOf:(ParserFlags stcCompilation)
             ifAbsent:1).

    "Modified: / 09-08-2006 / 18:49:38 / fm"
!

basicSaveSettings

    ParserFlags stcCompilation:(self class stcCompilationOptions at:self stcCompilationSelection value).
    ParserFlags stcCompilationIncludes:self stcIncludes value.
    ParserFlags stcCompilationDefines:self stcDefines value.
    ParserFlags stcCompilationOptions:self stcOptions value.
    ParserFlags ccCompilationOptions:self ccOptions value.
    ParserFlags ccPath:self cc value.
    ParserFlags makeCommand:self makeCommand value.

    self stc value ~= ParserFlags stcPath ifTrue:[
        ParserFlags stcPath:self stc value
    ].
    ParserFlags linkCommand:self linkCommand value.
    ParserFlags linkArgs:self linkArgs value.
    ParserFlags linkSharedArgs:self linkSharedArgs value.
    self stcLibraries value notNil ifTrue:[
        ParserFlags searchedLibraries:(self stcLibraries value asCollectionOfWords).
    ].
    stcLibraryPath notNil ifTrue:[
        ParserFlags libPath:(self stcLibraryPath value).
    ].

    "Modified: / 09-08-2006 / 19:33:10 / fm"
! !

!AbstractSettingsApplication::STCCompilerSettingsAppl methodsFor:'aspects'!

canLoadBinaries

    canLoadBinaries isNil ifTrue:[
        canLoadBinaries := (ObjectFileLoader notNil and:[ObjectFileLoader canLoadObjectFiles]) asValue.
    ].
    ^ canLoadBinaries.
!

cc

    cc isNil ifTrue:[
        cc := ValueHolder new.
        cc onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ cc.
!

ccOptions

    ccOptions isNil ifTrue:[
        ccOptions := ValueHolder new.
        ccOptions onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ ccOptions.
!

enableStcLibraryPath

    ^ (ObjectFileLoader libPath notNil and:[self canLoadBinaries])
!

linkArgs

    linkArgs isNil ifTrue:[
        linkArgs := ValueHolder new.
        linkArgs onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ linkArgs.
!

linkCommand

    linkCommand isNil ifTrue:[
        linkCommand := ValueHolder new.
        linkCommand onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ linkCommand.
!

linkSharedArgs

    linkSharedArgs isNil ifTrue:[
        linkSharedArgs := ValueHolder new.
        linkSharedArgs onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ linkSharedArgs.
!

makeCommand

    makeCommand isNil ifTrue:[
        makeCommand := ValueHolder new.
        makeCommand onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ makeCommand.

    "Created: / 09-08-2006 / 18:49:52 / fm"
!

stc

    stc isNil ifTrue:[
        stc := ValueHolder new.
        stc onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ stc.
!

stcCompilationList

    stcCompilationList isNil ifTrue:[
        stcCompilationList := (resources array:(self class stcCompilationStrings)) asList.
    ].
    ^ stcCompilationList.
!

stcCompilationSelection

    stcCompilationSelection isNil ifTrue:[
        stcCompilationSelection := (self class stcCompilationOptions indexOf:(ParserFlags stcCompilation) ifAbsent:1) asValue.
        stcCompilationSelection onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ stcCompilationSelection.
!

stcDefines

    stcDefines isNil ifTrue:[
        stcDefines := ValueHolder new.
        stcDefines onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ stcDefines.
!

stcIncludes

    stcIncludes isNil ifTrue:[
        stcIncludes := ValueHolder new.
        stcIncludes onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ stcIncludes.
!

stcLibraries

    stcLibraries isNil ifTrue:[
        stcLibraries := ValueHolder new.
        stcLibraries onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ stcLibraries.
!

stcLibraryPath

    stcLibraryPath isNil ifTrue:[
        stcLibraryPath := ValueHolder new.
        stcLibraryPath onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ stcLibraryPath.
!

stcOptions

    stcOptions isNil ifTrue:[
        stcOptions := ValueHolder new.
        stcOptions onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ stcOptions.
! !

!AbstractSettingsApplication::STCCompilerSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/compilerSettings.html'
! !

!AbstractSettingsApplication::STCCompilerSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    | searchedLibs |

    ((ParserFlags stcCompilation ? #default) ~= (self class stcCompilationOptions at:self stcCompilationSelection value)) ifTrue:[^ true].
    ((ObjectFileLoader notNil and:[ObjectFileLoader canLoadObjectFiles]) ~= self canLoadBinaries value ) ifTrue:[^ true].
    ((ParserFlags stcCompilationIncludes) ~= self stcIncludes value) ifTrue:[^ true].
    ((ParserFlags stcCompilationDefines) ~= self stcDefines value) ifTrue:[^ true].
    ((ParserFlags stcCompilationOptions) ~= self stcOptions value) ifTrue:[^ true].
    ((ParserFlags ccCompilationOptions) ~= self ccOptions value) ifTrue:[^ true].
    ((ParserFlags ccPath) ~= self cc value) ifTrue:[^ true].
    ((ParserFlags stcPath) ~= self stc value) ifTrue:[^ true].
    ((ParserFlags makeCommand) ~= self makeCommand value) ifTrue:[^ true].
    ((ParserFlags linkCommand) ~= self linkCommand value) ifTrue:[^ true].
    ((ParserFlags linkArgs) ~= self linkArgs value) ifTrue:[^ true].
    ((ParserFlags linkSharedArgs) ~= self linkSharedArgs value) ifTrue:[^ true].
     (ParserFlags libPath ~= self stcLibraryPath value) ifTrue:[^ true]. 

    searchedLibs := ParserFlags searchedLibraries.
    searchedLibs notNil ifTrue:[
        (String fromStringCollection:searchedLibs separatedBy:' ') ~= self stcLibraries value ifTrue:[^ true].
    ].
    ^ false.

    "Modified: / 09-08-2006 / 18:50:36 / fm"
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl class methodsFor:'defaults'!

exampleText

    ^  'methodSelector:methodArg
    "method comment:
     some stupid code to show the current settings"

    |index|

    "/ another comment ...
    self at:index+1.                    "/ a message
    self at:index put:methodArg.        "/ a two arg message
    self from:1 to:index put:methodArg. "/ a three arg message
    methodArg ifTrue:[
        Transcript showCR:''hello''.      "/ condition
    ].
    methodArg ifTrue:[
        Transcript showCR:''hello''.      "/ condition
    ] ifFalse:[
        Transcript showCR:''world''.      
    ].
    [methodArg] whileTrue:[
        Transcript showCR:''hello''.      "/ looping
    ].
    [self aVeryLongConditionBlock and:[self toMakeBlockLonger]] whileTrue:[
        Transcript showCR:''hello''.      "/ long blocks
    ].
    methodArg do:[:element |
        Transcript showCR:''hello''.      "/ looping
    ].
    1 to:methodArg size do:[:index |
        Transcript showCR:''hello''.      "/ looping
    ].
    methodArg keysAndValuesDo:[:index |
        Transcript showCR:''hello''.      "/ looping
    ].
    Object errorSignal handle:[:ex |      
        ex return                         
    ] do:[                                "/ exception handling
        self someAction                   "/ blocks
    ].
    ^ self.
'.
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::SourceCodeFormatSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth4Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(4)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
***************("H"H"H"H"H"Z**"EUUUUUUUUUY @*HV*)UUUUUUU&@B(!!ZUUUUUUUUVX@J"E)UUUUUUUUY @*HV*)UUUUUUU&@B(!!UUUV****%VX@J"E
UUUUUUUUUY @*HUUUU****)U&@B(!!UUUUUUUUUVXB*"EUUUZ****UY J*HUUUUUUUUUURJ*(!!UUUV****%UH**"EUUUUUUUUUT"**HV*)UUUUUUURJ*(!!UV%
UUUUUUUH**"EUZUUUUUUUT"**HV*)UUUUUUURJ*(!!UUUUUUUUUUH**"TQDQDQDQDQD"**("H"H"H"H"H"J(b') ; colorMapFromArray:#[240 160 80 192 80 0 64 0 0 240 208 160 0 0 0 240 240 240 192 192 192 240 128 0 208 208 208 48 48 48 160 160 160]; mask:((Depth1Image new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@_?? _??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0_??0O??0') ; yourself); yourself]
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::SourceCodeFormatSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::SourceCodeFormatSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::SourceCodeFormatSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Code Format Settings'
          name: 'Code Format Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 604 676)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel3'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: topSpace
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (VerticalPanelViewSpec
                    name: 'VerticalPanel1'
                    horizontalLayout: fit
                    verticalLayout: bottom
                    horizontalSpace: 3
                    verticalSpace: 3
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Box1'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Space around Temporaries'
                                name: 'CheckBox3'
                                layout: (LayoutFrame 0 0 0 0 250 0 22 0)
                                model: spaceAroundTemporaries
                                translateLabel: true
                              )
                             (CheckBoxSpec
                                label: 'Blank line after local Var Declaration'
                                name: 'CheckBox4'
                                layout: (LayoutFrame 250 0 0 0 0 1 22 0)
                                model: emptyLineAfterTemporaries
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 604 22)
                        )
                       (ViewSpec
                          name: 'Box11'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Space after ''^'''
                                name: 'CheckBox5'
                                layout: (LayoutFrame 0 0 0 0 250 0 22 0)
                                model: spaceAfterReturnToken
                                translateLabel: true
                              )
                             (CheckBoxSpec
                                label: 'Space after '':'' in Keywords'
                                name: 'CheckBox6'
                                layout: (LayoutFrame 250 0 0 0 -5 1 22 0)
                                model: spaceAfterKeywordSelector
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 604 22)
                        )
                       (ViewSpec
                          name: 'Box15'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Space after ''['''
                                name: 'CheckBox9'
                                layout: (LayoutFrame 0 0 0 0 250 0 22 0)
                                model: spaceAfterBlockStart
                                translateLabel: true
                              )
                             (CheckBoxSpec
                                label: 'Space before '']'''
                                name: 'CheckBox10'
                                layout: (LayoutFrame 250 0 0 0 -5 1 22 0)
                                model: spaceBeforeBlockEnd
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 604 22)
                        )
                       (ViewSpec
                          name: 'Box12'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'C-Style Blocks'
                                name: 'CheckBox8'
                                layout: (LayoutFrame 0 0 0 0 250 0 22 0)
                                model: cStyleBlocks
                                translateLabel: true
                              )
                             (CheckBoxSpec
                                label: 'Block Args on new Line'
                                name: 'CheckBox7'
                                layout: (LayoutFrame 250 0 0 0 -5 1 22 0)
                                model: blockArgumentsOnNewLine
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 604 22)
                        )
                       (ViewSpec
                          name: 'Box13'
                          component: 
                         (SpecCollection
                            collection: (
                             (LabelSpec
                                label: 'Indent:'
                                name: 'Label1'
                                layout: (LayoutFrame 0 0 0 0 250 0 22 0)
                                translateLabel: true
                                adjust: right
                              )
                             (InputFieldSpec
                                name: 'EntryField1'
                                layout: (LayoutFrame 253 0 0 0 300 0 22 0)
                                model: tabIndent
                                type: number
                                acceptOnReturn: true
                                acceptOnTab: true
                                acceptOnLostFocus: true
                                acceptOnPointerLeave: true
                              )
                             )
                           
                          )
                          extent: (Point 604 30)
                        )
                       (ViewSpec
                          name: 'Box16'
                          component: 
                         (SpecCollection
                            collection: (
                             (LabelSpec
                                label: 'Max Length for Single Line Blocks:'
                                name: 'Label5'
                                layout: (LayoutFrame 0 0 0 0 250 0 22 0)
                                translateLabel: true
                                adjust: right
                              )
                             (InputFieldSpec
                                name: 'EntryField4'
                                layout: (LayoutFrame 253 0 0 0 300 0 22 0)
                                model: maxLengthForSingleLineBlocks
                                type: number
                                acceptOnReturn: true
                                acceptOnTab: true
                                acceptOnLostFocus: true
                                acceptOnPointerLeave: true
                              )
                             )
                           
                          )
                          extent: (Point 604 29)
                        )
                       (HorizontalPanelViewSpec
                          name: 'HorizontalPanel1'
                          horizontalLayout: fitSpace
                          verticalLayout: bottom
                          horizontalSpace: 3
                          verticalSpace: 3
                          component: 
                         (SpecCollection
                            collection: (
                             (ActionButtonSpec
                                label: 'Reset to ST/X Default'
                                name: 'Button1'
                                translateLabel: true
                                tabable: true
                                model: resetToStxDefault
                                extent: (Point 297 22)
                              )
                             (ActionButtonSpec
                                label: 'Reset to RefactoryBrowser Default'
                                name: 'Button2'
                                translateLabel: true
                                tabable: true
                                model: resetToRBDefault
                                extent: (Point 298 22)
                              )
                             )
                           
                          )
                          extent: (Point 604 30)
                        )
                       )
                     
                    )
                    extent: (Point 604 180)
                  )
                 (ViewSpec
                    name: 'SpacingBox1'
                    extent: (Point 604 10)
                  )
                 (ViewSpec
                    name: 'Box14'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Sample Output:'
                          name: 'Label3'
                          layout: (LayoutFrame 0 0 0 0 0 1 22 0)
                          translateLabel: true
                          adjust: left
                        )
                       (TextEditorSpec
                          name: 'TextEditor3'
                          layout: (LayoutFrame 0 0 22 0 0 1 300 0)
                          model: editorText
                          hasHorizontalScrollBar: true
                          hasVerticalScrollBar: true
                          isReadOnly: true
                          postBuildCallback: postBuildTextEditor:
                        )
                       )
                     
                    )
                    extent: (Point 604 300)
                  )
                 (ViewSpec
                    name: 'SpacingBox2'
                    extent: (Point 604 10)
                  )
                 (CheckBoxSpec
                    label: 'Auto Format'
                    name: 'CheckBox2'
                    model: autoFormat
                    translateLabel: true
                    extent: (Point 604 22)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl methodsFor:'actions'!

basicReadSettings
    reformatLocked := true.

    self 
        readAspects:
            #( 
                tabIndent
                spaceAroundTemporaries
                emptyLineAfterTemporaries
                spaceAfterReturnToken
                spaceAfterKeywordSelector
                spaceAfterBlockStart
                spaceBeforeBlockEnd
                cStyleBlocks
                blockArgumentsOnNewLine
                maxLengthForSingleLineBlocks
            )
        from:RBFormatter.

    self autoFormat value:currentUserPrefs autoFormatting.
    self updateModifiedChannel.
    reformatLocked := false.
    self reformat.
!

basicSaveSettings

    currentUserPrefs autoFormatting:self autoFormat value.
    currentUserPrefs at:#'formatter.tabIndent' put:self tabIndent value.
    currentUserPrefs at:#'formatter.spaceAroundTemporaries' put:self spaceAroundTemporaries value.
    currentUserPrefs at:#'formatter.emptyLineAfterTemporaries' put:self emptyLineAfterTemporaries value.
    currentUserPrefs at:#'formatter.spaceAfterReturnToken' put:self spaceAfterReturnToken value.
    currentUserPrefs at:#'formatter.spaceAfterKeywordSelector' put:self spaceAfterKeywordSelector value.
    currentUserPrefs at:#'formatter.spaceAfterBlockStart' put:self spaceAfterBlockStart value.
    currentUserPrefs at:#'formatter.spaceBeforeBlockEnd' put:self spaceBeforeBlockEnd value.
    currentUserPrefs at:#'formatter.cStyleBlocks' put:self cStyleBlocks value.
    currentUserPrefs at:#'formatter.blockArgumentsOnNewLine' put:self blockArgumentsOnNewLine value.
    currentUserPrefs at:#'formatter.maxLengthForSingleLineBlocks' put:self maxLengthForSingleLineBlocks value.
    RBFormatter 
        tabIndent:self tabIndent value;
        spaceAroundTemporaries:self spaceAroundTemporaries value;
        emptyLineAfterTemporaries:self emptyLineAfterTemporaries value;
        spaceAfterReturnToken:self spaceAfterReturnToken value;
        spaceAfterKeywordSelector:self spaceAfterKeywordSelector value;
        spaceAfterBlockStart:self spaceAfterBlockStart value;
        spaceBeforeBlockEnd:self spaceBeforeBlockEnd value;
        cStyleBlocks:self cStyleBlocks value;
        blockArgumentsOnNewLine:self blockArgumentsOnNewLine value;
        maxLengthForSingleLineBlocks:self maxLengthForSingleLineBlocks value asInteger.
!

reformat

    |tree s_tabIndent s_spaceAroundTemporaries s_emptyLineAfterTemporaries
     s_spaceAfterReturnToken s_spaceAfterKeywordSelector s_cStyleBlocks
     s_maxLengthForSingleLineBlocks s_blockArgumentsOnNewLine
     s_spaceAfterBlockStart s_spaceBeforeBlockEnd|

    reformatLocked ifFalse:[
        "/
        "/ temporary change the RBFormatters settings ...
        "/
        s_tabIndent := RBFormatter tabIndent.
        s_spaceAroundTemporaries := RBFormatter spaceAroundTemporaries.
        s_emptyLineAfterTemporaries := RBFormatter emptyLineAfterTemporaries.
        s_spaceAfterReturnToken := RBFormatter spaceAfterReturnToken.
        s_spaceAfterKeywordSelector := RBFormatter spaceAfterKeywordSelector.
        s_spaceAfterBlockStart := RBFormatter spaceAfterBlockStart.
        s_spaceBeforeBlockEnd := RBFormatter spaceBeforeBlockEnd.
        s_cStyleBlocks := RBFormatter cStyleBlocks.
        s_blockArgumentsOnNewLine := RBFormatter blockArgumentsOnNewLine.
        s_maxLengthForSingleLineBlocks := RBFormatter maxLengthForSingleLineBlocks.

        RBFormatter 
            tabIndent:self tabIndent value;
            spaceAroundTemporaries:self spaceAroundTemporaries value;
            emptyLineAfterTemporaries:self emptyLineAfterTemporaries value;
            spaceAfterReturnToken:self spaceAfterReturnToken value;
            spaceAfterKeywordSelector:self spaceAfterKeywordSelector value;
            spaceAfterBlockStart:self spaceAfterBlockStart value;
            spaceBeforeBlockEnd:self spaceBeforeBlockEnd value;
            cStyleBlocks:self cStyleBlocks value;
            blockArgumentsOnNewLine:self blockArgumentsOnNewLine value;
            maxLengthForSingleLineBlocks:self maxLengthForSingleLineBlocks value.

"/        tree := RBParser 
"/                    parseMethod:self class exampleText
"/                    onError: [:aString :position | nil].
"/        tree do:[:node |
"/            (node ~~ tree and:[node parent isNil]) ifTrue:[
"/                self error:'No parent for node'.
"/            ]
"/        ].
"/        self editorText value:tree printString.
        self editorText value:(RBFormatter format:(self class exampleText)).

        RBFormatter 
            tabIndent:s_tabIndent;
            spaceAroundTemporaries:s_spaceAroundTemporaries;
            emptyLineAfterTemporaries:s_emptyLineAfterTemporaries;
            spaceAfterReturnToken:s_spaceAfterReturnToken;
            spaceAfterKeywordSelector:s_spaceAfterKeywordSelector;
            spaceAfterBlockStart:s_spaceAfterBlockStart;
            spaceBeforeBlockEnd:s_spaceBeforeBlockEnd;
            cStyleBlocks:s_cStyleBlocks;
            blockArgumentsOnNewLine:s_blockArgumentsOnNewLine;
            maxLengthForSingleLineBlocks:s_maxLengthForSingleLineBlocks.
      ].
!

resetToRBDefault

    reformatLocked := true.
    self tabIndent value: 8.
    self spaceAfterReturnToken value:false.
    self spaceAfterKeywordSelector value:true.
    self spaceAroundTemporaries value:true.
    self spaceAfterBlockStart value:true.
    self spaceBeforeBlockEnd value:true.
    self emptyLineAfterTemporaries value:false.
    self cStyleBlocks value:false.
    self blockArgumentsOnNewLine value:false.
    self maxLengthForSingleLineBlocks value: 20.
    reformatLocked := false.
    self reformat.
!

resetToStxDefault

    reformatLocked := true.
    self tabIndent value: 4.
    self spaceAfterReturnToken value: true.
    self spaceAfterKeywordSelector value: false.
    self spaceAroundTemporaries value: false.
    self spaceAfterBlockStart value:false.
    self spaceBeforeBlockEnd value:false.
    self emptyLineAfterTemporaries value: true.
    self cStyleBlocks value: true.
    self blockArgumentsOnNewLine value:false.
    self maxLengthForSingleLineBlocks value: 20.
    reformatLocked := false.
    self reformat.
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl methodsFor:'aspects'!

autoFormat

    autoFormat isNil ifTrue:[
        autoFormat := currentUserPrefs autoFormatting asValue.
        autoFormat onChangeSend:#updateModifiedChannel to:self
    ].
    ^ autoFormat.
!

blockArgumentsOnNewLine

    blockArgumentsOnNewLine isNil ifTrue:[
        blockArgumentsOnNewLine := true asValue.
        blockArgumentsOnNewLine addDependent:self.
    ].
    ^ blockArgumentsOnNewLine.
!

cStyleBlocks

    cStyleBlocks isNil ifTrue:[
        cStyleBlocks := true asValue.
        cStyleBlocks addDependent:self.
    ].
    ^ cStyleBlocks.
!

editorText

    editorText isNil ifTrue:[
        editorText := ValueHolder new.
    ].
    ^ editorText.
!

emptyLineAfterTemporaries

    emptyLineAfterTemporaries isNil ifTrue:[
        emptyLineAfterTemporaries := true asValue.
        emptyLineAfterTemporaries addDependent:self.
    ].
    ^ emptyLineAfterTemporaries.
!

maxLengthForSingleLineBlocks

    maxLengthForSingleLineBlocks isNil ifTrue:[
        maxLengthForSingleLineBlocks := ValueHolder new.
        maxLengthForSingleLineBlocks addDependent:self.
    ].
    ^ maxLengthForSingleLineBlocks.
!

spaceAfterBlockStart

    spaceAfterBlockStart isNil ifTrue:[
        spaceAfterBlockStart := true asValue.
        spaceAfterBlockStart addDependent:self.
    ].
    ^ spaceAfterBlockStart.
!

spaceAfterKeywordSelector

    spaceAfterKeywordSelector isNil ifTrue:[
        spaceAfterKeywordSelector := true asValue.
        spaceAfterKeywordSelector addDependent:self.
    ].
    ^ spaceAfterKeywordSelector.
!

spaceAfterReturnToken

    spaceAfterReturnToken isNil ifTrue:[
        spaceAfterReturnToken := true asValue.
        spaceAfterReturnToken addDependent:self.
    ].
    ^ spaceAfterReturnToken.
!

spaceAroundTemporaries

    spaceAroundTemporaries isNil ifTrue:[
        spaceAroundTemporaries := true asValue.
        spaceAroundTemporaries addDependent:self.
    ].
    ^ spaceAroundTemporaries.
!

spaceBeforeBlockEnd

    spaceBeforeBlockEnd isNil ifTrue:[
        spaceBeforeBlockEnd := true asValue.
        spaceBeforeBlockEnd addDependent:self.
    ].
    ^ spaceBeforeBlockEnd.
!

tabIndent

    tabIndent isNil ifTrue:[
        tabIndent := ValueHolder new.
        tabIndent addDependent:self.
    ].
    ^ tabIndent.
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl methodsFor:'change & update'!

update:something with:aParameter from:changedObject 
    (changedObject == self blockArgumentsOnNewLine 
    or:[ changedObject == self cStyleBlocks 
    or:[ changedObject == self emptyLineAfterTemporaries 
    or:[ changedObject == self maxLengthForSingleLineBlocks 
    or:[ changedObject == self spaceAfterKeywordSelector 
    or:[ changedObject == self spaceAfterReturnToken 
    or:[ changedObject == self spaceAfterBlockStart 
    or:[ changedObject == self spaceBeforeBlockEnd 
    or:[ changedObject == self spaceAroundTemporaries 
    or:[ changedObject == self tabIndent]]]]]]]]]) 
    ifTrue:[
        self updateModifiedChannel.
        self reformat.
        ^ self
    ].
    super 
        update:something
        with:aParameter
        from:changedObject
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/sourceFormatSettings.html'
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl methodsFor:'initialization & release'!

initialize
    super initialize.
    RBFormatter isNil ifTrue:[
        ^ self warn:'Sorry, no RBFormatter class'
    ].
    RBFormatter isLoaded ifFalse:[
        WindowGroup activeGroup withWaitCursorDo:[RBFormatter autoload]
    ].
    reformatLocked := false.
!

postBuildTextEditor:aWidget

    aWidget cursorMovementWhenUpdating:nil;
    scrollWhenUpdating:nil.
! !

!AbstractSettingsApplication::SourceCodeFormatSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    self autoFormat value ~= currentUserPrefs autoFormatting ? false ifTrue:[^ true].

    (self
        hasChangedAspectIn:
            #(
                tabIndent
                spaceAroundTemporaries
                emptyLineAfterTemporaries
                spaceAfterReturnToken
                spaceAfterKeywordSelector
                spaceAfterBlockStart
                spaceBeforeBlockEnd
                cStyleBlocks
                blockArgumentsOnNewLine
                maxLengthForSingleLineBlocks
            )
        asComparedTo:RBFormatter) ifTrue:[^ true].

    ^ false
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::SourceCodeManagementSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(8 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@A@PHB@0P@@@@@@@@@@@@@@@@@@@HEA \HA $JB0HD@@@@@@@@@@@@@@HLA04NC0HD@@L@@ P@@@@@@@@@@@@ED@ NDP@@@@@@@@@D@@@@@@@@
@@@BA \FAPP@@@@@@@@@@@P@@@@@@@@@AQ@RC0@@@@@@@@@@@@@@@@@@@@@@@@TGA!!DD@@@@@@@@@@@@@@@@@@@D@PDIA08OA@@@@@@@@@@@@@@@@@@@AP S
A0XIBPXGC0P@@@@@@@@@@@@@@@@ECAPLBPXOAP@@@@@@EQX@@@@@@@@@@@TIE@XOAP@@@@@@EQ\XE @@@@@@@@@@AP$OAP@@@@@@FQ\ZE!! V@@@@@@@@@@@E
F0@@@@@@EQ\ZF!!(VFAX@@@@@@@@@@@@@@@@ZEQ\VE!!(ZF!!XWF @@@@@@@@@@@@@@@@@@@A\ZE!!(@@@@@@@@@@@@@@@@@@@@@@@@XE!!XZ@@@@@@@@@@@@@@@@
@@@@@@@@EQ(V@@@@@@@@@@@@@@@@@@@@@@@@EQ\VE @@@@@@@@@@@@@@@@@@@@@@EQ VE @@@@@@@@@@@@@@F @@@@@WEQ VE!!(@@@@@@@@@@@@@@@@@E!!\W
EQXVE @@@@@@@@@@@@@@@@@@@@@@@A(Z@@@@@@@@@@@@@@@a') ; colorMapFromArray:#[0 0 0 32 64 0 0 64 0 32 32 0 0 32 0 32 96 32 96 192 128 192 224 192 160 224 160 32 128 64 64 96 64 64 96 32 32 160 64 160 224 192 64 160 96 32 128 32 224 224 224 64 128 64 160 192 160 224 224 192 32 160 96 160 160 160 64 64 64 96 96 96 128 128 128 192 192 192 32 32 32 32 64 32]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@O8@@?>@A??@A?C C<@0C8@PC8@@??@@??F@_>O@O<_ G8?0C1?8A#?<@C?<@@_@H@_@L@?@GC>@C?>@A?<@@_0@') ; yourself); yourself]
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::SourceCodeManagementSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::SourceCodeManagementSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::SourceCodeManagementSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Source Code Manager Settings'
          name: 'Source Code Manager Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 659 580)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: topSpace
              horizontalSpace: 3
              verticalSpace: 20
              component: 
             (SpecCollection
                collection: (
                 (VerticalPanelViewSpec
                    name: 'VerticalPanel3'
                    horizontalLayout: fit
                    verticalLayout: top
                    horizontalSpace: 3
                    verticalSpace: 4
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Box3'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Sourcecode Management'
                                name: 'SourcecodeManagementCheckBox'
                                layout: (LayoutFrame 5 0 5 0.0 300 0 27 0)
                                model: useManager
                                translateLabel: true
                              )
                             (ComboListSpec
                                name: 'ComboList1'
                                layout: (LayoutFrame -200 1 5 0 -5 1 27 0)
                                visibilityChannel: moreThanOneManagerTypesAvailable
                                enableChannel: useManager
                                model: selectedManagerTypeIndexHolder
                                comboList: availableManagerTypeNames
                                useIndex: true
                              )
                             )
                           
                          )
                          extent: (Point 659 30)
                        )
                       (ViewSpec
                          name: 'ManagerSetupBoxx'
                          component: 
                         (SpecCollection
                            collection: (
                             (FramedBoxSpec
                                label: 'Store-DB Repository Setup'
                                name: 'StoreSetupBox'
                                layout: (LayoutFrame 0 0 0 0 0 1 0 1)
                                visibilityChannel: managerIsStoreSourceCodeManager
                                labelPosition: topLeft
                                translateLabel: true
                                component: 
                               (SpecCollection
                                  collection: (
                                   (ViewSpec
                                      name: 'HostBox'
                                      layout: (LayoutFrame 0 0 0 0 0 1 25 0)
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (LabelSpec
                                            label: 'DB or DB@Host:'
                                            name: 'StoreHostLabel'
                                            layout: (LayoutFrame 0 0.0 0 0 40 0.25 22 0)
                                            level: 0
                                            translateLabel: true
                                            adjust: right
                                          )
                                         (ComboBoxSpec
                                            name: 'StoreHostComboBox'
                                            layout: (LayoutFrame 44 0.25 0 0 0 1 22 0)
                                            enableChannel: useManager
                                            tabable: true
                                            model: storeHostnameHolder
                                            immediateAccept: true
                                            acceptOnLeave: true
                                            acceptOnReturn: true
                                            acceptOnTab: true
                                            acceptOnLostFocus: true
                                            acceptChannel: acceptChannel
                                            acceptOnPointerLeave: true
                                            comboList: storeHostPrototypeList
                                          )
                                         )
                                       
                                      )
                                    )
                                   (ViewSpec
                                      name: 'UserBox'
                                      layout: (LayoutFrame 0 0.0 27 0 0 1 52 0)
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (LabelSpec
                                            label: 'Username:'
                                            name: 'StoreUserLabel'
                                            layout: (LayoutFrame 0 0.0 0 0 40 0.25 22 0)
                                            level: 0
                                            translateLabel: true
                                            adjust: right
                                          )
                                         (InputFieldSpec
                                            name: 'StoreUserEntryField'
                                            layout: (LayoutFrame 44 0.25 0 0 0 1 22 0)
                                            enableChannel: useManager
                                            tabable: true
                                            model: storeUsernameHolder
                                            acceptChannel: acceptChannel
                                            acceptOnPointerLeave: true
                                          )
                                         )
                                       
                                      )
                                    )
                                   (ViewSpec
                                      name: 'PasswordBox'
                                      layout: (LayoutFrame 0 0.0 54 0 0 1 79 0)
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (LabelSpec
                                            label: 'Password:'
                                            name: 'Label7'
                                            layout: (LayoutFrame 0 0.0 0 0 40 0.25 22 0)
                                            level: 0
                                            translateLabel: true
                                            adjust: right
                                          )
                                         (InputFieldSpec
                                            name: 'PasswordEntryField'
                                            layout: (LayoutFrame 44 0.25 0 0 -130 1 22 0)
                                            enableChannel: useManager
                                            tabable: true
                                            model: storePasswordHolder
                                            type: password
                                            acceptChannel: acceptChannel
                                            acceptOnPointerLeave: true
                                          )
                                         )
                                       
                                      )
                                    )
                                   (HorizontalPanelViewSpec
                                      name: 'HorizontalPanel4'
                                      layout: (LayoutFrame -130 1 51 0 0 1 82 0)
                                      horizontalLayout: fitSpace
                                      verticalLayout: center
                                      horizontalSpace: 3
                                      verticalSpace: 3
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (ActionButtonSpec
                                            label: 'Try to Connect'
                                            name: 'TryConnectButton1'
                                            translateLabel: true
                                            tabable: true
                                            model: storeConnect
                                            enableChannel: storeConnectEnabled
                                            extent: (Point 124 22)
                                          )
                                         )
                                       
                                      )
                                    )
                                   (LabelSpec
                                      label: 'DB per Module:'
                                      name: 'Label4'
                                      layout: (LayoutFrame 0 0.0 82 0 40 0.25 104 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (SequenceViewSpec
                                      name: 'List2'
                                      layout: (LayoutFrame 44 0.25 82 0 0 1 180 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: selectedPerStoreModuleRoot
                                      hasHorizontalScrollBar: true
                                      hasVerticalScrollBar: true
                                      miniScrollerHorizontal: true
                                      useIndex: false
                                      sequenceList: listOfModules
                                    )
                                   (LabelSpec
                                      label: 'Module:'
                                      name: 'perModuleModuleLabel'
                                      layout: (LayoutFrame 0 0.0 186 0 40 0.25 203 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'perModuleModuleEntryField'
                                      layout: (LayoutFrame 44 0.25 182 0 0 1 204 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: perStoreModuleRoot
                                      acceptChannel: acceptChannel
                                      acceptOnPointerLeave: true
                                    )
                                   (LabelSpec
                                      label: 'DB:'
                                      name: 'perModuleDBLabel'
                                      layout: (LayoutFrame 0 0.0 211 0 40 0.25 228 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (ComboBoxSpec
                                      name: 'perModuleModuleHostComboBox2'
                                      layout: (LayoutFrame 44 0.25 207 0 0 1 229 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: perStoreModuleHostnameHolder
                                      immediateAccept: true
                                      acceptOnLeave: true
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptChannel: acceptChannel
                                      acceptOnPointerLeave: true
                                      comboList: storeHostPrototypeList
                                    )
                                   (LabelSpec
                                      label: 'User / Password:'
                                      name: 'perModuleUserPasswordLabel'
                                      layout: (LayoutFrame 0 0.0 236 0 40 0.25 253 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'perModuleUserEntryField'
                                      layout: (LayoutFrame 44 0.25 232 0 -2 0.65 254 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: perStoreModuleUsernameHolder
                                      acceptChannel: acceptChannel
                                      acceptOnPointerLeave: true
                                    )
                                   (InputFieldSpec
                                      name: 'perModulePasswordEntryField'
                                      layout: (LayoutFrame 5 0.65 232 0 0 1 254 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: perStoreModulePasswordHolder
                                      type: password
                                      acceptChannel: acceptChannel
                                      acceptOnPointerLeave: true
                                    )
                                   (HorizontalPanelViewSpec
                                      name: 'HorizontalPanel5'
                                      layout: (LayoutFrame 44 0.25 -25 1 -10 0.65 6 1)
                                      horizontalLayout: fit
                                      verticalLayout: center
                                      horizontalSpace: 3
                                      verticalSpace: 3
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (ActionButtonSpec
                                            label: 'Add/Apply'
                                            name: 'AddButton2'
                                            translateLabel: true
                                            tabable: true
                                            model: addPerStoreModuleDB
                                            enableChannel: useManager
                                            extent: (Point 96 22)
                                          )
                                         (ActionButtonSpec
                                            label: 'Remove'
                                            name: 'RemoveButton3'
                                            translateLabel: true
                                            tabable: true
                                            model: removePerStoreModuleDB
                                            enableChannel: removeEnabled
                                            extent: (Point 97 22)
                                          )
                                         )
                                       
                                      )
                                    )
                                   (HorizontalPanelViewSpec
                                      name: 'HorizontalPanel6'
                                      layout: (LayoutFrame 10 0.65 -25 1 0 1 6 1)
                                      horizontalLayout: fit
                                      verticalLayout: center
                                      horizontalSpace: 3
                                      verticalSpace: 3
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (ActionButtonSpec
                                            label: 'Try to Connect'
                                            name: 'ConnectPerStoreModuleButton'
                                            translateLabel: true
                                            tabable: true
                                            model: connectPerStoreModuleDB
                                            enableChannel: storeConnectInModuleEnabled
                                            extent: (Point 103 22)
                                          )
                                         (ActionButtonSpec
                                            label: 'Browse'
                                            name: 'BrowsePerStoreModuleButton'
                                            translateLabel: true
                                            tabable: true
                                            model: browsePerStoreModuleDB
                                            enableChannel: storeConnectInModuleEnabled
                                            extent: (Point 103 22)
                                          )
                                         )
                                       
                                      )
                                    )
                                   )
                                 
                                )
                              )
                             (FramedBoxSpec
                                label: 'SmallTeam Setup'
                                name: 'SmalltalkSmallTeamSetupBox'
                                layout: (LayoutFrame 0 0 0 0 0 1 0 1)
                                visibilityChannel: managerIsSmallTeamSourceCodeManager
                                labelPosition: topLeft
                                translateLabel: true
                                component: 
                               (SpecCollection
                                  collection: (
                                   (ViewSpec
                                      name: 'HostBoxSS'
                                      layout: (LayoutFrame 0 0 0 0 0 1 25 0)
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (LabelSpec
                                            label: 'Host:'
                                            name: 'SmallTeamHostLabel'
                                            layout: (LayoutFrame 0 0.0 0 0 40 0.25 22 0)
                                            level: 0
                                            translateLabel: true
                                            adjust: right
                                          )
                                         (ComboBoxSpec
                                            name: 'SmallTeamHostComboBox'
                                            layout: (LayoutFrame 44 0.25 0 0 0 1 22 0)
                                            enableChannel: useManager
                                            tabable: true
                                            model: smallTeamHostnameHolder
                                            immediateAccept: true
                                            acceptOnLeave: true
                                            acceptOnReturn: true
                                            acceptOnTab: true
                                            acceptOnLostFocus: true
                                            acceptChannel: acceptChannel
                                            acceptOnPointerLeave: true
                                            comboList: smallTeamHostPrototypeList
                                          )
                                         )
                                       
                                      )
                                    )
                                   (HorizontalPanelViewSpec
                                      name: 'HorizontalPanel7'
                                      layout: (LayoutFrame -130 1 51 0 0 1 82 0)
                                      horizontalLayout: fitSpace
                                      verticalLayout: center
                                      horizontalSpace: 3
                                      verticalSpace: 3
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (ActionButtonSpec
                                            label: 'Try to Connect'
                                            name: 'TryConnectButton4'
                                            translateLabel: true
                                            tabable: true
                                            model: smallTeamConnect
                                            enableChannel: storeConnectEnabled
                                            extent: (Point 124 22)
                                          )
                                         )
                                       
                                      )
                                    )
                                   (LabelSpec
                                      label: 'Host per Module:'
                                      name: 'perSmallTeamModuleLabel'
                                      layout: (LayoutFrame 0 0.0 82 0 40 0.25 104 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (SequenceViewSpec
                                      name: 'List3'
                                      layout: (LayoutFrame 44 0.25 82 0 0 1 180 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: selectedPerSmallTeamModuleRoot
                                      hasHorizontalScrollBar: true
                                      hasVerticalScrollBar: true
                                      miniScrollerHorizontal: true
                                      useIndex: false
                                      sequenceList: listOfModules
                                    )
                                   (LabelSpec
                                      label: 'Module:'
                                      name: 'Label12'
                                      layout: (LayoutFrame 0 0.0 186 0 40 0.25 203 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'EntryField3'
                                      layout: (LayoutFrame 44 0.25 182 0 0 1 204 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: perSmallTeamModuleRoot
                                      acceptChannel: acceptChannel
                                      acceptOnPointerLeave: true
                                    )
                                   (LabelSpec
                                      label: 'Host:'
                                      name: 'Label13'
                                      layout: (LayoutFrame 0 0.0 211 0 40 0.25 228 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (ComboBoxSpec
                                      name: 'ComboBox2'
                                      layout: (LayoutFrame 44 0.25 207 0 0 1 229 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: perSmallTeamModuleHostnameHolder
                                      immediateAccept: true
                                      acceptOnLeave: true
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptChannel: acceptChannel
                                      acceptOnPointerLeave: true
                                      comboList: smallTeamHostPrototypeList
                                    )
                                   (HorizontalPanelViewSpec
                                      name: 'HorizontalPanel8'
                                      layout: (LayoutFrame 44 0.25 -25 1 -10 0.65 6 1)
                                      horizontalLayout: fit
                                      verticalLayout: center
                                      horizontalSpace: 3
                                      verticalSpace: 3
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (ActionButtonSpec
                                            label: 'Add/Apply'
                                            name: 'AddButton5'
                                            translateLabel: true
                                            tabable: true
                                            model: addPerSmallTeamModuleHost
                                            enableChannel: useManager
                                            extent: (Point 96 22)
                                          )
                                         (ActionButtonSpec
                                            label: 'Remove'
                                            name: 'RemoveButton6'
                                            translateLabel: true
                                            tabable: true
                                            model: removePerSmallTeamModuleHost
                                            enableChannel: removeEnabled
                                            extent: (Point 97 22)
                                          )
                                         )
                                       
                                      )
                                    )
                                   (HorizontalPanelViewSpec
                                      name: 'HorizontalPanel9'
                                      layout: (LayoutFrame 10 0.65 -25 1 0 1 6 1)
                                      horizontalLayout: fit
                                      verticalLayout: center
                                      horizontalSpace: 3
                                      verticalSpace: 3
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (ActionButtonSpec
                                            label: 'Try to Connect'
                                            name: 'ConnectButton7'
                                            translateLabel: true
                                            tabable: true
                                            model: connectPerSmallTeamModuleHost
                                            enableChannel: storeConnectInModuleEnabled
                                            extent: (Point 103 22)
                                          )
                                         (ActionButtonSpec
                                            label: 'Browse'
                                            name: 'BrowseButton8'
                                            translateLabel: true
                                            tabable: true
                                            model: browsePerSmallTeamModuleHost
                                            enableChannel: storeConnectInModuleEnabled
                                            extent: (Point 103 22)
                                          )
                                         )
                                       
                                      )
                                    )
                                   )
                                 
                                )
                              )
                             (FramedBoxSpec
                                label: 'CVS Sourcecode Manager Setup'
                                name: 'CVSSetupBox'
                                layout: (LayoutFrame 0 0 0 0 0 1 0 1)
                                visibilityChannel: managerIsCVSSourceCodeManager
                                labelPosition: topLeft
                                translateLabel: true
                                component: 
                               (SpecCollection
                                  collection: (
                                   (ViewSpec
                                      name: 'Box1'
                                      layout: (LayoutFrame 0 0 0 0 0 1 25 0)
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (LabelSpec
                                            label: 'CVS Command or Path:'
                                            name: 'Label1'
                                            layout: (LayoutFrame 0 0.0 0 0 60 0.25 22 0)
                                            level: 0
                                            translateLabel: true
                                            adjust: right
                                          )
                                         (InputFieldSpec
                                            name: 'CVSExecutableField'
                                            layout: (LayoutFrame 64 0.25 0 0 0 1 22 0)
                                            enableChannel: useManager
                                            tabable: true
                                            model: cvsExecutableHolder
                                            acceptChannel: acceptChannel
                                            acceptOnPointerLeave: true
                                          )
                                         )
                                       
                                      )
                                    )
                                   (ViewSpec
                                      name: 'Box7'
                                      layout: (LayoutFrame 0 0.0 27 0 0 1 52 0)
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (LabelSpec
                                            label: 'CVSRoot default:'
                                            name: 'defaultCvsRootLabel'
                                            layout: (LayoutFrame 0 0.0 0 0 60 0.25 22 0)
                                            level: 0
                                            translateLabel: true
                                            adjust: right
                                          )
                                         (ComboBoxSpec
                                            name: 'cvsRootComboBox'
                                            layout: (LayoutFrame 64 0.25 0 0 0 1 22 0)
                                            enableChannel: useManager
                                            tabable: true
                                            model: cvsRootHolder
                                            immediateAccept: true
                                            acceptOnLeave: true
                                            acceptOnReturn: true
                                            acceptOnTab: true
                                            acceptOnLostFocus: true
                                            acceptChannel: acceptChannel
                                            acceptOnPointerLeave: true
                                            comboList: cvsRootPrototypeList
                                          )
                                         )
                                       
                                      )
                                    )
                                   (HorizontalPanelViewSpec
                                      name: 'HorizontalPanel3'
                                      layout: (LayoutFrame 44 0.25 51 0 -1 1 82 0)
                                      horizontalLayout: fitSpace
                                      verticalLayout: center
                                      horizontalSpace: 3
                                      verticalSpace: 3
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (ViewSpec
                                            name: 'Box8'
                                            extent: (Point 102 10)
                                          )
                                         (ViewSpec
                                            name: 'Box9'
                                            extent: (Point 102 10)
                                          )
                                         (ViewSpec
                                            name: 'Box10'
                                            extent: (Point 102 10)
                                          )
                                         (ActionButtonSpec
                                            label: 'CVS-Login'
                                            name: 'loginButton1'
                                            translateLabel: true
                                            tabable: true
                                            model: loginCVSRoot
                                            enableChannel: cvsLoginEnabled
                                            extent: (Point 103 22)
                                          )
                                         )
                                       
                                      )
                                    )
                                   (LabelSpec
                                      label: 'CVSRoot per Module:'
                                      name: 'knownModulesLabel'
                                      layout: (LayoutFrame 0 0.0 82 0 60 0.25 104 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (SequenceViewSpec
                                      name: 'List1'
                                      layout: (LayoutFrame 64 0.25 82 0 0 1 201 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: selectedPerModuleRoot
                                      hasHorizontalScrollBar: true
                                      hasVerticalScrollBar: true
                                      miniScrollerHorizontal: true
                                      useIndex: false
                                      sequenceList: listOfModules
                                    )
                                   (LabelSpec
                                      label: 'Module:'
                                      name: 'moduleLabel'
                                      layout: (LayoutFrame 0 0.0 211 0 60 0.25 228 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'perModuleRootModuleEntryField'
                                      layout: (LayoutFrame 64 0.25 207 0 0 1 229 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: perModuleRootModule
                                      acceptChannel: acceptChannel
                                      acceptOnPointerLeave: true
                                    )
                                   (LabelSpec
                                      label: 'CVSRoot:'
                                      name: 'cvsRootLabel'
                                      layout: (LayoutFrame 0 0.0 236 0 60 0.25 253 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (ComboBoxSpec
                                      name: 'perModuleRootComboBox'
                                      layout: (LayoutFrame 64 0.25 232 0 0 1.0 254 0)
                                      enableChannel: useManager
                                      tabable: true
                                      model: perModuleRoot
                                      immediateAccept: true
                                      acceptOnLeave: true
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptChannel: acceptChannel
                                      acceptOnPointerLeave: true
                                      comboList: cvsRootPrototypeList
                                    )
                                   (HorizontalPanelViewSpec
                                      name: 'HorizontalPanel2'
                                      layout: (LayoutFrame 64 0.25 -25 1 -1 1 0 1)
                                      horizontalLayout: fitSpace
                                      verticalLayout: center
                                      horizontalSpace: 3
                                      verticalSpace: 3
                                      component: 
                                     (SpecCollection
                                        collection: (
                                         (ActionButtonSpec
                                            label: 'Add/Apply'
                                            name: 'addButton'
                                            translateLabel: true
                                            tabable: true
                                            model: addPerModuleRoot
                                            enableChannel: useManager
                                            extent: (Point 97 22)
                                          )
                                         (ActionButtonSpec
                                            label: 'Remove'
                                            name: 'removeButton'
                                            translateLabel: true
                                            tabable: true
                                            model: removePerModuleRoot
                                            enableChannel: removeEnabled
                                            extent: (Point 97 22)
                                          )
                                         (ViewSpec
                                            name: 'Box11'
                                            extent: (Point 97 10)
                                          )
                                         (ActionButtonSpec
                                            label: 'CVS-Login'
                                            name: 'loginButton2'
                                            translateLabel: true
                                            tabable: true
                                            model: loginPerModuleRoot
                                            enableChannel: cvsLoginInModuleEnabled
                                            extent: (Point 98 22)
                                          )
                                         )
                                       
                                      )
                                    )
                                   )
                                 
                                )
                              )
                             )
                           
                          )
                          extent: (Point 659 327)
                        )
                       (FramedBoxSpec
                          label: 'Source Cache'
                          name: 'FramedBox1'
                          labelPosition: topLeft
                          translateLabel: true
                          component: 
                         (SpecCollection
                            collection: (
                             (ViewSpec
                                name: 'SourceCacheDirBox'
                                layout: (LayoutFrame 0 0 0 0 0 1 30 0)
                                component: 
                               (SpecCollection
                                  collection: (
                                   (LabelSpec
                                      label: 'Source Cache Dir:'
                                      name: 'SourceCacheDirLabel'
                                      layout: (LayoutFrame 0 0.0 0 0 60 0.25 22 0)
                                      translateLabel: true
                                      adjust: right
                                    )
                                   (InputFieldSpec
                                      name: 'SourceCacheDirEntryField'
                                      layout: (LayoutFrame 64 0.25 0 0 0 1 22 0)
                                      enableChannel: useManager
                                      model: sourceCacheDir
                                      immediateAccept: false
                                      acceptOnReturn: true
                                      acceptOnTab: true
                                      acceptOnLostFocus: true
                                      acceptOnPointerLeave: true
                                    )
                                   )
                                 
                                )
                              )
                             (HorizontalPanelViewSpec
                                name: 'CacheActionsHorizontalPanel'
                                layout: (LayoutFrame 44 0.25 33 0 0 1 67 0)
                                horizontalLayout: fitSpace
                                verticalLayout: center
                                horizontalSpace: 3
                                verticalSpace: 3
                                component: 
                               (SpecCollection
                                  collection: (
                                   (ActionButtonSpec
                                      label: 'Flush Cache now'
                                      name: 'FlushCacheNowButton'
                                      translateLabel: true
                                      tabable: true
                                      model: flushSourceCache
                                      enableChannel: useManager
                                      extent: (Point 208 22)
                                    )
                                   (ActionButtonSpec
                                      label: 'Condense Cache now'
                                      name: 'CondenseCacheNowButton'
                                      translateLabel: true
                                      tabable: true
                                      model: condenseSourceCache
                                      enableChannel: useManager
                                      extent: (Point 208 22)
                                    )
                                   )
                                 
                                )
                              )
                             )
                           
                          )
                          extent: (Point 659 95)
                        )
                       (ViewSpec
                          name: 'UseLocalSourceBox'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'If Present, Use Local Source (Suppress Checkout)'
                                name: 'CheckBox4'
                                layout: (LayoutFrame 30 0 0 0 -5 1 23 0)
                                enableChannel: useManager
                                model: localSourceFirst
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 659 24)
                        )
                       (ViewSpec
                          name: 'Box12'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Keep Method Source (In Image)'
                                name: 'CheckBox7'
                                layout: (LayoutFrame 30 0 0 0 -5 1 23 0)
                                enableChannel: useManager
                                model: keepMethodSource
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 659 24)
                        )
                       (ViewSpec
                          name: 'CheckForHaltSendsBox'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Check for halt/error-Sends when Checking in'
                                name: 'CheckBox5'
                                layout: (LayoutFrame 30 0 0 0 -5 1 23 0)
                                enableChannel: useManager
                                model: checkClassesWhenCheckingIn
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 659 24)
                        )
                       (ViewSpec
                          name: 'VerboseBox'
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'Verbose (Trace Access on Transcript)'
                                name: 'CheckBox6'
                                layout: (LayoutFrame 30 0 0 0 -5 1 23 0)
                                enableChannel: useManager
                                model: verboseSourceCodeAccess
                                translateLabel: true
                              )
                             )
                           
                          )
                          extent: (Point 659 24)
                        )
                       )
                     
                    )
                    extent: (Point 659 768)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'accessing'!

manager

    ^ Smalltalk at:#SourceCodeManager
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'actions'!

addModule:module withData:data
    (self listOfModules includes:module) ifFalse:[
        self listOfModules add:module; sort.
    ].
    rootsPerModule at:module put:data.

    self updateModifiedChannel.

    "Created: / 08-11-2006 / 19:25:21 / cg"
!

basicReadSettings
    self initialize.

    self keepMethodSource value:(currentUserPrefs keepMethodSourceCode).

    self hasManager ifTrue:[
        self useManager value:(manager := Smalltalk at:#SourceCodeManager) notNil.
        self localSourceFirst value:Class tryLocalSourceFirst.
        self sourceCacheDir value:(AbstractSourceCodeManager cacheDirectoryName).

        manager notNil ifTrue:[
            manager forgetDisabledModules.
            manager isCVS ifTrue:[
                repository := manager repositoryName.
                repositoryHolder := (repository ? '') asValue
            ].
            manager isStore ifTrue:[
                self storeHostnameHolder value: (manager hostAndDBName).
                self storeUsernameHolder value: (manager userName).
                self storePasswordHolder value: (manager password).
            ].
        ].
    ] ifFalse:[
        self useManager value:false.
        self localSourceFirst value:false.
    ].

    self availableManagers do:[:eachManager |
        |infoPerModule|

        infoPerModule := eachManager repositoryInfoPerModule.
        infoPerModule keysAndValuesDo:[:module :info | 
            rootsPerModule at:module put:(Array with:eachManager with:info).
        ].
    ].

    self updateSelectedManager.

    self checkClassesWhenCheckingIn value:(currentUserPrefs at:#checkClassesWhenCheckingIn ifAbsent:true).
    self cvsRootHolder value:CVSSourceCodeManager repositoryName ? '/cvs/stx'.
    self cvsExecutableHolder value:CVSSourceCodeManager cvsExecutable.
    self verboseSourceCodeAccess value:CVSSourceCodeManager verboseSourceCodeAccess. 

    rootsPerModule notNil ifTrue:[
        self listOfModules removeAll.
        listOfModules addAll:rootsPerModule keys asList.
    ].
"/    self selectedPerModuleRootChanged.

    "Modified: / 21-09-2006 / 16:52:47 / cg"
!

basicSaveSettings
    |modules|

    currentUserPrefs at:#checkClassesWhenCheckingIn put:self checkClassesWhenCheckingIn value.
    Class tryLocalSourceFirst:self localSourceFirst value.
    currentUserPrefs keepMethodSourceCode:(self keepMethodSource value).

    (self hasManager and:[self useManager value]) ifTrue:[
        manager ~~ self selectedManager ifTrue:[
            manager := nil.
        ].

        manager isNil ifTrue:[
            manager := self selectedManager.
            manager isNil ifTrue:[
                manager := self availableManagers first.
            ].
        ].
        Smalltalk at:#SourceCodeManager put:manager.
        manager notNil ifTrue:[
            | nm fn|

            nm := self sourceCacheDir value.
            nm notEmptyOrNil ifTrue:[
                (fn := nm asFilename) exists ifFalse:[
                    (self confirm:('CVS cache directory ''' , nm , ''' does not exist\create ?' withCRs)) ifTrue:[
                        fn recursiveMakeDirectory; 
                           makeReadableForAll;
                           makeWritableForAll;
                           makeExecutableForAll.
                    ]
                ].
                (fn isDirectory
                and:[fn isReadable
                and:[fn isWritable]]) ifTrue:[
                    AbstractSourceCodeManager cacheDirectoryName:nm.
                ] ifFalse:[
                    self warn:'Invalid sourceCache directory.'
                ]
            ].
        ].

        self availableManagers do:[:eachManager |
            |infoPerModule|
            modules := rootsPerModule select:[:entry | entry first == eachManager].
            infoPerModule := Dictionary new.
            modules keysAndValuesDo:[:module :entry | 
                entry first == eachManager ifTrue:[
                    infoPerModule at:module put:(entry second).
                ].
            ].
            eachManager repositoryInfoPerModule:infoPerModule.
        ].

        manager isCVS ifTrue:[
            self basicSaveCVSSettings.
        ] ifFalse:[ manager isStore ifTrue:[
            self basicSaveStoreSettings.
        ] ifFalse:[ manager isSmallTeam ifTrue:[
            self basicSaveSmallTeamSettings.
        ] ifFalse:[
            self error.
        ]]].

        self sourceCacheDir value:(AbstractSourceCodeManager cacheDirectoryName).

        DebugView newDebugger. "/ ???
    ] ifFalse:[
        Smalltalk at:#SourceCodeManager put:nil
    ].

    self acceptChannel value.

    "Modified: / 09-11-2006 / 14:56:52 / cg"
!

condenseSourceCache
    self withWaitCursorDo:[ AbstractSourceCodeManager condenseSourceCache ].
    Method flushSourceStreamCache.

    "Modified: / 28-11-2006 / 12:21:33 / cg"
!

flushSourceCache
    self withWaitCursorDo:[ AbstractSourceCodeManager flushSourceCache ].
    Method flushSourceStreamCache.

    "Modified: / 28-11-2006 / 12:21:21 / cg"
!

removePerModuleRoot

    |module|

    acceptChannel value:true.    
    module := self perModuleRootModule value.
    self listOfModules remove:module ifAbsent:nil.
    rootsPerModule removeKey:module ifAbsent:nil.
    self perModuleRootModule value:nil.
    self perModuleRoot value:nil.
    self updateModifiedChannel.
!

setupSourceCodeManager

   AbstractLauncherApplication::LauncherDialogs cvsConfigurationDialog.
   manager := (Smalltalk at:#SourceCodeManager).
   manager notNil ifTrue:[
        repositoryHolder value: manager repositoryName.
        sourceCacheDir value:(AbstractSourceCodeManager cacheDirectoryName).
   ].

    "Modified: / 16-08-2006 / 11:07:51 / cg"
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'actions - cvs'!

addPerModuleRoot
    |module cvsRoot|

    acceptChannel value:true.    

    module := self perModuleRootModule value.
    cvsRoot := self perModuleRoot value.

    cvsRoot size > 0 ifTrue:[
        self addModule:module withData:(Array with:CVSSourceCodeManager with:cvsRoot).
    ].

    "Modified: / 08-11-2006 / 19:27:39 / cg"
!

basicSaveCVSSettings
    |cvsRoot|

    repositoryHolder notNil ifTrue:[
        repositoryHolder value size > 0 ifTrue:[
            manager notNil ifTrue:[
                manager initializeForRepository:repositoryHolder value.
            ]
        ].
    ].
    CVSSourceCodeManager cvsExecutable:((self cvsExecutableHolder value ? '') withoutSeparators).
    CVSSourceCodeManager initializeForRepository:(cvsRoot := self cvsRootHolder value).
    CVSSourceCodeManager verboseSourceCodeAccess: verboseSourceCodeAccess value. 

    RecentlyUsedCVSRoots isNil ifTrue:[
        RecentlyUsedCVSRoots := OrderedCollection new.
    ].
    (RecentlyUsedCVSRoots includes:cvsRoot) ifFalse:[
        RecentlyUsedCVSRoots addFirst:cvsRoot.
        RecentlyUsedCVSRoots size > 20 ifTrue:[
            RecentlyUsedCVSRoots removeLast.
        ].
    ].

    "Modified: / 29-09-2006 / 12:28:50 / cg"
!

cvsLogin:cvsRoot
    |cmd term|

    VT100TerminalView isNil ifTrue:[
        self warn:'Function not available'.
        ^ self.
    ].

    cmd := 'cvs -d ' , cvsRoot , ' login ; exit'.
    term := VT100TerminalView open.
    term topView 
        label:'CVS Login for ' , cvsRoot;
        waitUntilVisible.
    term shellTerminateAction:[
        "/ term topView destroy
    ].

    term showCR:(('Please enter the CVS-password then close this terminal window.') allBold colorizeAllWith:Color red).
    term showCR:''.
    term endEntry.
    Delay waitForSeconds:1.
    term sendLine:cmd.

    "
     self basicNew cvsLogin:':pserver:stx@exept.eu.org:/stx'
    "

    "Modified: / 25-08-2010 / 23:03:19 / cg"
!

loginCVSRoot
    self cvsLogin:cvsRootHolder value.
!

loginPerModuleRoot
    self cvsLogin:perModuleRoot value.
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'actions - smallTeam'!

addPerSmallTeamModuleHost
    |module host|

    acceptChannel value:true.    

    module := self perSmallTeamModuleRoot value.
    host := self perSmallTeamModuleHostnameHolder value.

    self addModule:module withData:(Array with:SmallTeamSourceCodeManager with:host).

    "Created: / 09-11-2006 / 14:35:50 / cg"
!

basicSaveSmallTeamSettings
    |host|

    SmallTeamSourceCodeManager hostName:(host := self smallTeamHostnameHolder value withoutSeparators).

    RecentlyUsedSmallTeamHosts isNil ifTrue:[
        RecentlyUsedSmallTeamHosts := OrderedCollection new.
    ].
    (RecentlyUsedSmallTeamHosts includes:host) ifFalse:[
        RecentlyUsedSmallTeamHosts addFirst:host.
        RecentlyUsedSmallTeamHosts size > 20 ifTrue:[
            RecentlyUsedSmallTeamHosts removeLast.
        ].
    ].

    "Created: / 09-11-2006 / 14:58:44 / cg"
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'actions - store'!

addPerStoreModuleDB
    |module info|

    acceptChannel value:true.    

    module := self perStoreModuleRoot value.
    info := StoreSourceCodeManager newDBInfo.
    info hostAndDBName:perStoreModuleHostnameHolder value.
    info userName:perStoreModuleUsernameHolder value.
    info password:perStoreModulePasswordHolder value.

    self addModule:module withData:(Array with:StoreSourceCodeManager with:info).

    "Modified: / 08-11-2006 / 19:27:35 / cg"
!

basicSaveStoreSettings
    |storeHost|

    StoreSourceCodeManager hostAndDBName:(storeHost := self storeHostnameHolder value withoutSeparators).
    StoreSourceCodeManager userName:(self storeUsernameHolder value withoutSeparators).
    StoreSourceCodeManager password:(self storePasswordHolder value withoutSeparators).

    storeHost notEmptyOrNil ifTrue:[
        StoreSourceCodeManager connectToDatabase.
    ].

    RecentlyUsedStoreHosts isNil ifTrue:[
        RecentlyUsedStoreHosts := OrderedCollection new.
    ].
    (RecentlyUsedStoreHosts includes:storeHost) ifFalse:[
        RecentlyUsedStoreHosts addFirst:storeHost.
        RecentlyUsedStoreHosts size > 20 ifTrue:[
            RecentlyUsedStoreHosts removeLast.
        ].
    ].
!

browsePerStoreModuleDB
    |testInfo|

    testInfo := StoreSourceCodeManager newDBInfo.
    testInfo hostAndDBName:(perStoreModuleHostnameHolder value).
    testInfo userName:(perStoreModuleUsernameHolder value).
    testInfo password:(perStoreModulePasswordHolder value).
    self browseStoreDB:testInfo
!

browseStoreDB:dbInfo
    Tools::StoreProjectBrowser openOn:dbInfo
!

connectPerStoreModuleDB
    |testInfo|

    testInfo := StoreSourceCodeManager newDBInfo.
    testInfo hostAndDBName:(perStoreModuleHostnameHolder value).
    testInfo userName:(perStoreModuleUsernameHolder value).
    testInfo password:(perStoreModulePasswordHolder value).

    (self tryToConnectTo:testInfo)
!

storeConnect
    |testInfo|

    testInfo := StoreSourceCodeManager newDBInfo.
    testInfo hostAndDBName:(storeHostnameHolder value).
    testInfo userName:(storeUsernameHolder value).
    testInfo password:(storePasswordHolder value).

    (self tryToConnectTo:testInfo) ifTrue:[
        LastStoreHost := storeHostnameHolder value.
        LastStoreUser := storeUsernameHolder value.
        LastStorePassword := storePasswordHolder value.
    ].
!

tryToConnectTo:dbInfo
    |session|

    SQL::SQLError handle:[:ex |
        self warn:('Failed to connect to Database:\\' withCRs,ex description).
        ^ false.
    ] do:[
        self withWaitCursorDo:[
            session := StoreSourceCodeManager tryToConnectToDatabase:dbInfo.
        ]
    ].
    session isNil ifTrue:[
        self warn:'OOPS - Failed to connect'.
        ^ false.
    ].

    self information:('Successfully connected to ',dbInfo dbName,'.').
    session disconnect.
    ^ true
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'aspects'!

acceptChannel

    acceptChannel isNil ifTrue:[
        acceptChannel := TriggerValue new.
    ].
    ^ acceptChannel.
!

availableManagerTypeNames
    ^ self availableManagers collect:[:cls | cls managerTypeName].

    "Created: / 16-08-2006 / 11:16:25 / cg"
!

availableManagers
    availableManagers isNil ifTrue:[
        availableManagers := AbstractSourceCodeManager availableManagers.
    ].
    ^ availableManagers.

    "
     self basicNew availableManagers   
    "

    "Created: / 16-08-2006 / 11:01:10 / cg"
!

checkClassesWhenCheckingIn

    checkClassesWhenCheckingIn isNil ifTrue:[
        checkClassesWhenCheckingIn := (currentUserPrefs at:#checkClassesWhenCheckingIn ifAbsent:true) asValue.
        checkClassesWhenCheckingIn onChangeSend:#updateModifiedChannel to:self
    ].
    ^ checkClassesWhenCheckingIn.
!

cvsExecutableHolder
    cvsExecutableHolder isNil ifTrue:[
        cvsExecutableHolder := ValueHolder new.
        cvsExecutableHolder onChangeSend:#updateModifiedChannel to:self
    ].
    ^ cvsExecutableHolder.

    "Created: / 21-09-2006 / 15:37:06 / cg"
!

cvsLoginEnabled
    cvsLoginEnabled isNil ifTrue:[
        cvsLoginEnabled := false asValue.
    ].
    ^ cvsLoginEnabled.
!

cvsLoginInModuleEnabled
    cvsLoginInModuleEnabled isNil ifTrue:[
        cvsLoginInModuleEnabled := false asValue.
    ].
    ^ cvsLoginInModuleEnabled.
!

cvsRootHolder

    cvsRootHolder isNil ifTrue:[
        cvsRootHolder := self cvsRootFromCVSRootFileOrNil asValue.
        cvsRootHolder addDependent:self.
    ].
    ^ cvsRootHolder.
!

cvsRootPrototypeList
    |cvsRoot prototypeList|

    cvsRootPrototypeList isNil ifTrue:[
        prototypeList := OrderedSet new.

        cvsRoot := self cvsRootFromCVSRootFileOrNil.
        cvsRoot notNil ifTrue:[
            prototypeList add:cvsRoot    
        ].

        prototypeList add:(':pserver:cvs@cvs.smalltalk-x.de:/cvs/stx').

        OperatingSystem getDomainName = 'bh.exept.de' ifTrue:[
            prototypeList add:(':pserver:' , OperatingSystem getLoginName , '@cvs.bh.exept.de:/cvs/stx')
        ] ifFalse:[
            prototypeList add:(':pserver:' , OperatingSystem getLoginName , '@CVSHOST:/cvs/stx').
        ].

        OperatingSystem isUNIXlike ifTrue:[
            prototypeList add:'/cvs/stx'.
        ] ifFalse:[
            OperatingSystem isMSDOSlike ifTrue:[
                prototypeList addFirst:':local:c:\cvs\stx'.
            ] ifFalse:[
                "there might be more here in the future"
            ]
        ].

        cvsRootPrototypeList := prototypeList asOrderedCollection.
    ].
    ^ cvsRootPrototypeList.
!

keepMethodSource

    keepMethodSource isNil ifTrue:[
        keepMethodSource := ValueHolder new.
        keepMethodSource onChangeSend:#updateModifiedChannel to:self
    ].
    ^ keepMethodSource.
!

listOfModules

    listOfModules isNil ifTrue:[
        rootsPerModule notNil ifTrue:[
            listOfModules := rootsPerModule keys asList.
        ].
        listOfModules sort.
        listOfModules onChangeSend:#updateModifiedChannel to:self
    ].
    ^ listOfModules.
!

localSourceFirst

    localSourceFirst isNil ifTrue:[
        localSourceFirst := ValueHolder new.
        localSourceFirst onChangeSend:#updateModifiedChannel to:self
    ].
    ^ localSourceFirst.
!

managerIsCVSSourceCodeManager
    managerIsCVSSourceCodeManager isNil ifTrue:[
        managerIsCVSSourceCodeManager := (SourceCodeManager notNil and:
                                         [SourceCodeManager isCVS]) asValue.
    ].
    ^ managerIsCVSSourceCodeManager.

    "Created: / 16-08-2006 / 10:56:38 / cg"
!

managerIsSmallTeamSourceCodeManager
    managerIsSmallTeamSourceCodeManager isNil ifTrue:[
        managerIsSmallTeamSourceCodeManager := (SourceCodeManager notNil and:
                                         [SourceCodeManager isSmallTeam]) asValue.
    ].
    ^ managerIsSmallTeamSourceCodeManager.

    "Created: / 09-11-2006 / 14:33:53 / cg"
!

managerIsStoreSourceCodeManager
    managerIsStoreSourceCodeManager isNil ifTrue:[
        managerIsStoreSourceCodeManager := (SourceCodeManager notNil and:
                                         [SourceCodeManager isStore]) asValue.
    ].
    ^ managerIsStoreSourceCodeManager.

    "Created: / 16-08-2006 / 10:57:13 / cg"
!

moreThanOneManagerTypesAvailable
    ^ self availableManagers size > 1

    "Created: / 16-08-2006 / 11:22:03 / cg"
!

perModuleFieldsEnableHolder

    perModuleFieldsEnableHolder isNil ifTrue:[
        perModuleFieldsEnableHolder := true asValue.
        perModuleFieldsEnableHolder addDependent:self.
    ].
    ^ perModuleFieldsEnableHolder.
!

perModuleRoot
    perModuleRoot isNil ifTrue:[
        perModuleRoot := ValueHolder new.
        perModuleRoot addDependent:self.
    ].
    ^ perModuleRoot.
!

perModuleRootModule
    perModuleRootModule isNil ifTrue:[
        perModuleRootModule := ValueHolder new.
    ].
    ^ perModuleRootModule.
!

perSmallTeamModuleHostnameHolder
    perSmallTeamModuleHostnameHolder isNil ifTrue:[
        perSmallTeamModuleHostnameHolder := ValueHolder new.
    ].
    ^ perSmallTeamModuleHostnameHolder.

    "Created: / 09-11-2006 / 14:40:29 / cg"
!

perSmallTeamModuleRoot
    perSmallTeamModuleRoot isNil ifTrue:[
        perSmallTeamModuleRoot := ValueHolder new.
        perSmallTeamModuleRoot addDependent:self.
    ].
    ^ perSmallTeamModuleRoot.

    "Created: / 09-11-2006 / 14:40:35 / cg"
!

perSmallTeamModuleRootModule
    perSmallTeamModuleRootModule isNil ifTrue:[
        perSmallTeamModuleRootModule := ValueHolder new.
    ].
    ^ perSmallTeamModuleRootModule.

    "Created: / 09-11-2006 / 14:40:41 / cg"
!

perStoreModuleFieldsEnableHolder

    perSmallTeamModuleFieldsEnableHolder isNil ifTrue:[
        perSmallTeamModuleFieldsEnableHolder := true asValue.
        perSmallTeamModuleFieldsEnableHolder addDependent:self.
    ].
    ^ perSmallTeamModuleFieldsEnableHolder.
!

perStoreModuleHostnameHolder

    perStoreModuleHostnameHolder isNil ifTrue:[
        perStoreModuleHostnameHolder := '' asValue.
        perStoreModuleHostnameHolder addDependent:self.
    ].
    ^ perStoreModuleHostnameHolder.
!

perStoreModulePasswordHolder

    perStoreModulePasswordHolder isNil ifTrue:[
        perStoreModulePasswordHolder := '' asValue.
        perStoreModulePasswordHolder addDependent:self.
    ].
    ^ perStoreModulePasswordHolder.
!

perStoreModuleRoot
    perStoreModuleRoot isNil ifTrue:[
        perStoreModuleRoot := ValueHolder new.
        perStoreModuleRoot addDependent:self.
    ].
    ^ perStoreModuleRoot.
!

perStoreModuleRootModule
    perStoreModuleRootModule isNil ifTrue:[
        perStoreModuleRootModule := ValueHolder new.
    ].
    ^ perStoreModuleRootModule.
!

perStoreModuleUsernameHolder

    perStoreModuleUsernameHolder isNil ifTrue:[
        perStoreModuleUsernameHolder := '' asValue.
        perStoreModuleUsernameHolder addDependent:self.
    ].
    ^ perStoreModuleUsernameHolder.
!

removeEnabled

    removeEnabled isNil ifTrue:[
        removeEnabled := false asValue.
    ].
    ^ removeEnabled.
!

selectedManager
    |idx|

    self availableManagers size == 1 ifTrue:[
        ^ self availableManagers first
    ].

    idx := self selectedManagerTypeIndexHolder value.
    (idx == 0 or:[idx isNil]) ifTrue:[ ^ nil].
    ^ self availableManagers at:idx

    "Modified: / 16-08-2006 / 11:18:50 / cg"
!

selectedManagerTypeIndexHolder
    |selectedManager|

    selectedManagerTypeIndexHolder isNil ifTrue:[
        selectedManagerTypeIndexHolder := nil asValue.
        selectedManagerTypeIndexHolder onChangeEvaluate:[
            selectedManager := self selectedManager.
            self managerIsCVSSourceCodeManager value:( selectedManager notNil and:[ selectedManager isCVS] ).
            self managerIsStoreSourceCodeManager value:( selectedManager notNil and:[ selectedManager isStore] ).
            self managerIsSmallTeamSourceCodeManager value:( selectedManager notNil and:[ selectedManager isSmallTeam] ).
            self updateModifiedChannel
        ].

        self updateSelectedManager.
    ].
    ^ selectedManagerTypeIndexHolder.

    "Created: / 16-08-2006 / 11:17:20 / cg"
    "Modified: / 09-11-2006 / 14:34:54 / cg"
!

selectedPerModuleRoot
    selectedPerModuleRoot isNil ifTrue:[
        selectedPerModuleRoot := ValueHolder new.
        selectedPerModuleRoot addDependent:self.
    ].
    ^ selectedPerModuleRoot.
!

selectedPerSmallTeamModuleRoot
    selectedPerSmallTeamModuleRoot isNil ifTrue:[
        selectedPerSmallTeamModuleRoot := ValueHolder new.
        selectedPerSmallTeamModuleRoot addDependent:self.
    ].
    ^ selectedPerSmallTeamModuleRoot.

    "Created: / 09-11-2006 / 14:39:15 / cg"
!

selectedPerStoreModuleRoot
    selectedPerStoreModuleRoot isNil ifTrue:[
        selectedPerStoreModuleRoot := ValueHolder new.
        selectedPerStoreModuleRoot addDependent:self.
    ].
    ^ selectedPerStoreModuleRoot.
!

smallTeamHostnameHolder

    smallTeamHostnameHolder isNil ifTrue:[
        smallTeamHostnameHolder := '' asValue.
        "/ smallTeamHostnameHolder addDependent:self.
    ].
    ^ smallTeamHostnameHolder.

    "Created: / 09-11-2006 / 15:04:10 / cg"
!

sourceCacheDir
    sourceCacheDir isNil ifTrue:[
        sourceCacheDir := ValueHolder new.
        sourceCacheDir onChangeSend:#updateModifiedChannel to:self
    ].
    ^ sourceCacheDir.
!

storeConnectEnabled
    storeConnectEnabled isNil ifTrue:[
        storeConnectEnabled := false asValue.
    ].
    ^ storeConnectEnabled.
!

storeConnectInModuleEnabled
    storeConnectInModuleEnabled isNil ifTrue:[
        storeConnectInModuleEnabled := false asValue.
    ].
    ^ storeConnectInModuleEnabled.
!

storeHostPrototypeList
    |prototypeList|

    storeHostPrototypeList isNil ifTrue:[
        prototypeList := OrderedSet new.

        prototypeList add:('public@store.smalltalk-x.de:5432').
        prototypeList add:('public').
        prototypeList add:('stx').

        OperatingSystem getLoginName = 'cg' ifTrue:[
            prototypeList add:('oyster@store.smalltalk-x.de:5432').
            prototypeList add:('oyster').
        ].

        OperatingSystem getDomainName = 'exept.de' ifTrue:[
            prototypeList add:('stx@exept.exept.de:5432').
        ] ifFalse:[
            prototypeList add:('db@host').
            prototypeList add:('db@host:port').
        ].
        storeHostPrototypeList := prototypeList asOrderedCollection.
    ].
    ^ storeHostPrototypeList.
!

storeHostnameHolder

    storeHostnameHolder isNil ifTrue:[
        storeHostnameHolder := ("LastStoreHost ?" '') asValue.
        storeHostnameHolder addDependent:self.
    ].
    ^ storeHostnameHolder.
!

storeLoginEnabled
    storeLoginEnabled isNil ifTrue:[
        storeLoginEnabled := false asValue.
    ].
    ^ storeLoginEnabled.

    "Created: / 16-08-2006 / 11:11:15 / cg"
!

storePasswordHolder

    storePasswordHolder isNil ifTrue:[
        storePasswordHolder := ("LastStorePassword ?" '') asValue.
        storePasswordHolder addDependent:self.
    ].
    ^ storePasswordHolder.
!

storeUsernameHolder

    storeUsernameHolder isNil ifTrue:[
        storeUsernameHolder := ("LastStoreUser ?" '') asValue.
        storeUsernameHolder addDependent:self.
    ].
    ^ storeUsernameHolder.
!

useManager
    useManager isNil ifTrue:[
        useManager := ValueHolder new.
        useManager onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useManager.
!

verboseSourceCodeAccess
    verboseSourceCodeAccess isNil ifTrue:[
        verboseSourceCodeAccess := false asValue.
        verboseSourceCodeAccess onChangeSend:#updateModifiedChannel to:self
    ].
    ^ verboseSourceCodeAccess.
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'change & update'!

selectedPerModuleRootChanged
    |module entry|

    self acceptChannel value:true.    
    module := self selectedPerModuleRoot value.
    module isNil ifTrue:[ 
        self removeEnabled value:false.
        self perModuleRootModule value:' '.
        self perModuleRoot value:''.
        ^ self
    ].

    entry := rootsPerModule at:module ifAbsent:#().    
    (entry first = CVSSourceCodeManager) ifTrue:[
        self removeEnabled value:true.
        self perModuleRootModule value:module.
        self perModuleRoot value:(entry at:2).
    ] ifFalse:[
        self removeEnabled value:false.
        self perModuleRootModule value:module , ' ',('<<use ',entry first managerTypeName,'>>') allBold.
        self perModuleRoot value:''.
    ].
!

selectedPerSmallTeamModuleRootChanged
    |module entry|

    self acceptChannel value:true.    

    module := self selectedPerSmallTeamModuleRoot value.
    module isNil ifTrue:[ 
        self removeEnabled value:false.
        self perSmallTeamModuleRoot value:''.
        self perSmallTeamModuleHostnameHolder value:''.
        ^ self
    ].

    entry := rootsPerModule at:module.    
    (entry first = SmallTeamSourceCodeManager) ifTrue:[
        self removeEnabled value:true.
        self perSmallTeamModuleRoot value:module.
        self perSmallTeamModuleHostnameHolder value:(entry at:2).
    ] ifFalse:[
        self removeEnabled value:false.
        self perSmallTeamModuleRoot value:module , ' ',('<<use ',entry first managerTypeName,'>>') allBold.
        self perSmallTeamModuleHostnameHolder value:''.
    ].

    "Created: / 09-11-2006 / 14:39:04 / cg"
!

selectedPerStoreModuleRootChanged
    |module entry|

    self acceptChannel value:true.    

    module := self selectedPerStoreModuleRoot value.
    module isNil ifTrue:[ 
        self removeEnabled value:false.
        self perStoreModuleRoot value:''.
        self perStoreModuleHostnameHolder value:''.
        self perStoreModuleUsernameHolder value:''.
        self perStoreModulePasswordHolder value:''.
        ^ self
    ].

    entry := rootsPerModule at:module ifAbsent:#().    
    (entry first = StoreSourceCodeManager) ifTrue:[
        self removeEnabled value:true.
        self perStoreModuleRoot value:module.
        self perStoreModuleHostnameHolder value:(entry at:2) hostAndDBName.
        self perStoreModuleUsernameHolder value:(entry at:2) userName.
        self perStoreModulePasswordHolder value:(entry at:2) password.
    ] ifFalse:[
        self removeEnabled value:false.
        self perStoreModuleRoot value:module , ' ',('<<use ',entry first managerTypeName,'>>') allBold.
        self perStoreModuleHostnameHolder value:''.
        self perStoreModuleUsernameHolder value:''.
        self perStoreModulePasswordHolder value:''.
    ].
!

sourceDirChanged
    |nm fn previousDir|

    manager isNil ifTrue:[^ self].

    previousDir := AbstractSourceCodeManager cacheDirectoryName.

    nm := self sourceCacheDir value.
    nm isEmptyOrNil ifTrue:[^ self].

    (fn := nm asFilename) exists ifFalse:[
        (self confirm:(resources 
                            stringWithCRs:'SourceCache directory "%1" does not exist.\Create ?'
                            with:nm)
        ) ifFalse:[
            self sourceCacheDir value:previousDir.
            ^ self.
        ].
        fn 
            recursiveMakeDirectory; 
            makeReadableForAll;
            makeWritableForAll;
            makeExecutableForAll.
        ^ self.
    ].

    (fn isDirectory) ifFalse:[
        self warn:(resources 
                            stringWithCRs:'Not a directory: "%1"'
                            with:nm).
        self sourceCacheDir value:previousDir.
        ^ self.
    ].

    (fn isReadable and:[fn isWritable]) ifFalse:[
        (self confirm:(resources 
                            stringWithCRs:'SourceCache directory "%1" is not both readable and writable.\Change ?'
                            with:nm)
        ) ifFalse:[
            self sourceCacheDir value:previousDir.
            ^ self.
        ].
        fn
            makeReadableForAll;
            makeWritableForAll;
            makeExecutableForAll.
    ].
"/    (fn isReadableForAll and:[fn isWritableForAll]) ifFalse:[
"/        (self confirm:(resources 
"/                            stringWithCRs:'SourceCache directory "%1" is not both readable and writable for other users.\Change ?'
"/                            with:nm)
"/        ) ifTrue:[
"/            fn
"/                makeReadableForAll;
"/                makeWritableForAll;
"/                makeExecutableForAll.
"/        ]
"/    ].
!

update:something with:aParameter from:changedObject 
    "/ common    
    changedObject == sourceCacheDir ifTrue:[
        self sourceDirChanged.
        self updateModifiedChannel.
        ^ self
    ].

    "/ cvs
    changedObject == cvsRootHolder ifTrue:[
        self updateModifiedChannel.
        self updateLoginEnableHolders.
        ^ self
    ].
    changedObject == perModuleRoot ifTrue:[
        self updateLoginEnableHolders.
        ^ self
    ].
    changedObject == selectedPerModuleRoot ifTrue:[
        self selectedPerModuleRootChanged.
        ^ self
    ].

    "/ store
    changedObject == storeHostnameHolder ifTrue:[
        self updateConnectEnableHolders.
        ^ self
    ].
    changedObject == storeUsernameHolder ifTrue:[
        self updateConnectEnableHolders.
        ^ self
    ].
    changedObject == storePasswordHolder ifTrue:[
        self updateConnectEnableHolders.
        ^ self
    ].
    changedObject == perStoreModuleRoot ifTrue:[
        self updateConnectEnableHolders.
        ^ self
    ].
    changedObject == perStoreModuleHostnameHolder ifTrue:[
        self updateConnectEnableHolders.
        ^ self
    ].
    changedObject == perStoreModuleUsernameHolder ifTrue:[
        self updateConnectEnableHolders.
        ^ self
    ].
    changedObject == perStoreModulePasswordHolder ifTrue:[
        self updateConnectEnableHolders.
        ^ self
    ].
    changedObject == selectedPerStoreModuleRoot ifTrue:[
        self selectedPerStoreModuleRootChanged.
        ^ self
    ].

    "/ SmallTeam
    changedObject == selectedPerSmallTeamModuleRoot ifTrue:[
        self selectedPerSmallTeamModuleRootChanged.
        ^ self
    ].

    super update:something with:aParameter from:changedObject

    "Modified: / 09-11-2006 / 14:41:10 / cg"
!

updateConnectEnableHolders
    self storeConnectEnabled 
        value:(storeHostnameHolder value notEmptyOrNil
               and:[ storeUsernameHolder value notEmptyOrNil
               and:[ storePasswordHolder value notEmptyOrNil ]]).

    self storeConnectInModuleEnabled 
        value:(perStoreModuleHostnameHolder value notEmptyOrNil
               and:[ perStoreModuleUsernameHolder value notEmptyOrNil
               and:[ perStoreModulePasswordHolder value notEmptyOrNil ]]).
!

updateLoginEnableHolders
    self cvsLoginEnabled value:((cvsRootHolder value ? '') startsWith:':pserver:').
    self cvsLoginInModuleEnabled value:((perModuleRoot value ? '') startsWith:':pserver:').
!

updateSelectedManager
    |selectedManagerTypeIndex|

    selectedManagerTypeIndex := self availableManagers indexOf:SourceCodeManager.
    selectedManagerTypeIndex == 0 ifTrue:[
        self availableManagers size == 1 ifTrue:[
            selectedManagerTypeIndex := 1.
        ].
    ].
    self selectedManagerTypeIndexHolder value:selectedManagerTypeIndex.
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/cvsSetup.html'
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'initialization & release'!

initialize
    (AbstractSourceCodeManager notNil) ifTrue:[ AbstractSourceCodeManager autoload ].

    useManager := false asValue.
    useManager onChangeSend:#updateModifiedChannel to:self.

    sourceCacheDir := nil asValue.
    sourceCacheDir addDependent:self.

    repositoryHolder := '' asValue.
    rootsPerModule := Dictionary new.

    self availableManagers do:[:eachManager |
        eachManager repositoryInfoPerModule 
            keysAndValuesDo:[:module :info |
                module withoutSeparators ~= module ifTrue:[
                    self halt:'should not happen any longer'
                ].
                rootsPerModule at:module put:(Array with:eachManager with:info)
            ].
    ].

    super initialize.

    "Modified: / 08-11-2006 / 19:20:32 / cg"
! !

!AbstractSettingsApplication::SourceCodeManagementSettingsAppl methodsFor:'queries'!

cvsRootFromCVSRootFileOrNil
    |cvsDir cvsRootFile cvsRoot|

    cvsDir := 'CVS' asFilename.
    cvsDir isDirectory ifTrue:[
        cvsRootFile := cvsDir construct:'Root'.
        cvsRootFile isReadable ifTrue:[
            cvsRoot := cvsRootFile contents firstIfEmpty:nil.
        ].
    ].
    ^ cvsRoot
!

hasManager
    "true if ANY source code management class is available"

    ^ AbstractSourceCodeManager notNil and:[AbstractSourceCodeManager isLoaded]
!

hasUnsavedChanges
    (self useManager value ~= ((Smalltalk at:#SourceCodeManager) notNil)) ifTrue:[^ true].
    (Smalltalk at:#SourceCodeManager) ~~ self selectedManager ifTrue:[^ true].
    (self hasManager and:[self useManager value]) ifFalse:[^ false].

    (Class tryLocalSourceFirst ~= self localSourceFirst value) ifTrue:[^ true].
    ((self selectedManager cacheDirectoryName ? '') ~= (self sourceCacheDir value ? '')) ifTrue:[^ true].

    ((currentUserPrefs at:#checkClassesWhenCheckingIn ifAbsent:true) ~= self checkClassesWhenCheckingIn value)  
        ifTrue:[^ true].

    ((currentUserPrefs keepMethodSourceCode) ~= self keepMethodSource value)  
        ifTrue:[^ true].

    self availableManagers do:[:mgr |
        |modules|

        modules := rootsPerModule select:[:entry | entry first == mgr].

        mgr repositoryInfoPerModule keysAndValuesDo:[:module :info |
            ((modules includesKey:module) and:[info = (modules at:module) second])
            ifFalse:[^ true].
        ].
        modules keysAndValuesDo:[:module :info|
            ((mgr repositoryInfoPerModule includesKey:module) and:[(mgr repositoryInfoPerModule at:module) = info second])
            ifFalse:[^ true].
        ].
    ].

    self selectedManager isCVS ifTrue:[
        ((CVSSourceCodeManager cvsExecutable ? '') ~= (self cvsExecutableHolder value ? '') withoutSeparators)  
            ifTrue:[^ true].

        (CVSSourceCodeManager repositoryName ? '/files/CVS' ~= self cvsRootHolder value)    
            ifTrue:[^ true].

        (CVSSourceCodeManager verboseSourceCodeAccess ~= self verboseSourceCodeAccess value) 
            ifTrue:[^ true].
    ].

    self selectedManager isStore ifTrue:[
        ((StoreSourceCodeManager hostAndDBName ? '') ~= (self storeHostnameHolder value ? '') withoutSeparators)  
            ifTrue:[^ true].
        ((StoreSourceCodeManager userName ? '') ~= (self storeUsernameHolder value ? '') withoutSeparators)  
            ifTrue:[^ true].
        ((StoreSourceCodeManager password ? '') ~= (self storePasswordHolder value ? '') withoutSeparators)  
            ifTrue:[^ true].
    ].
            
    ^ false

    "Modified: / 09-11-2006 / 14:49:14 / cg"
! !

!AbstractSettingsApplication::StyleSettingsAppl class methodsFor:'defaults'!

standardStyles

    ^  #(
        'decWindows'
        'iris' 
        'motif' 
        'mswindows95' 
        'mswindowsxp' 
        'mswindowsvista' 
        "/ 'next' 
        "/ 'normal'
        "/ 'os2' 
        'sgmotif' 
        "/ 'st80' 
       )
! !

!AbstractSettingsApplication::StyleSettingsAppl class methodsFor:'image specs'!

closePreviewButtonImage
      ^ ToolbarIconLibrary removeTabIcon
!

defaultIcon
    ^ self defaultIcon2
!

defaultIcon1
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon1 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon1
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::StyleSettingsAppl class defaultIcon1'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(8)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@DA@@@@@@@@@@@@@@@@@@@@@@@@@@DB@0D@@@@@@@@@@@@@@@@@@@@@@@DB@0LD@P@@@@@@@@@@@@@@@@@@@@DB@0LDA@DA@@@@@@@@@@@@
@@@@@@TB@ HDA@XF@PD@@@@@@@@@@@@@@@TB@ HB@ \FA  H@P@@@@@@@@@@@@TB@ HB@ HBB@XIB@ A@@@@@@@@@@TB@ HB@ HB@ (KB@ KB0DC@@@@@@TB
@ HB@ HB@ HB@ ,KB0LC@P@@@@@@APHB@ HB@ HBB (JB0LC@0HL@@4MCP4MCP4MCP4MCP4MCP4AC HE@@@MCPHCC0<PDQHRD1PB@0LM@ DE@@@@CP4B@0<O
DADRD!!LT@ LCCPHE@@@@@@4M@08UEQTVE!!XWE0LNC 4E@@@@@@@EAPHB@ HB@ HB@ HJB (E@@@@@@@@APTB@ HB@ HB@ HBB (JAP@@@@@@@@TE@ HB@ HB
@ HBB (JB T@@@@@@@@EAPHB@ HB@ HB@ (JB (E@@@@@@@@APTB@ HB@ HB@ HJB (JAP@@@@@@@@TE@ HB@ HB@ HBB (JB T@@@@@@@@EAPHB@ HB@ HB
B (JB (E@@@@@@@@APTEAPTEAPTEAPTEAPTEAP@@@@@@@@@a') ; colorMapFromArray:#[0 0 0 32 96 80 240 240 240 192 192 192 64 144 128 80 80 80 48 112 112 48 128 128 32 96 96 48 128 112 224 224 224 32 80 80 64 96 96 0 80 128 128 128 128 16 144 192 16 128 176 16 128 160 0 112 160 0 112 144 0 96 144 16 112 144 0 96 128 0 80 112]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@C@@@G @@O0@@_8@@?<@A?>@C??@G??0O??0G??8???0??? ???@??>@??<@??<@??<@??<@??<@??<@??<@??<@') ; yourself); yourself]
!

defaultIcon2
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon2 inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon2
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:'AbstractSettingsApplication::MiscDisplaySettingsAppl class defaultIcon2'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#[8]); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@@0L@@@@@@@@@@@@@@@@@@@@@@@@@@0_GQT@@@@@@@@@@@@@@@@@@@@@@@0\GQ4ZEP@@@@@@@@@@@@@@@@@@@@0[GQ4ZF!!TU@@@@@@@@@@@@
@@@@@AL[G!!8ZF!!\WEQT@@@@@@@@@@@@@@AL[G!!8^G!! WE1TUEP@@@@@@@@@@@AL[G!!8^G!!8^EQ\XEQTU@@@@@@@@@AL[G!!8^G!!8^G!!8TEQTTE@0@@@@@@AL[
G!!8^G!!8^G!!8^G!!PTEAPTC@@@@@@@D18^G!!8^G!!8^G!!8^EAPTEAPQ@@HB@ HB@ HB@ HB@ HB@ HTEAPS@@@B@!!0YB (IB@XFAPP\FQ$BG!!PS@@@@@ H\FP(J
BP FA TDGA$Y@!!8S@@@@@@HBFQXGA0\C@0LA@Q$VE HS@@@@@@@SD10\GA0\GA0\GA0[F1,S@@@@@@@@D1L\GA0\GA0\GA0\F1,[D0@@@@@@@ALSGA0\GA0\
GA0\F1,[F1L@@@@@@@@SD10\GA0\GA0\GA,[F1,S@@@@@@@@D1L\GA0\GA0\GA0[F1,[D0@@@@@@@ALSGA0\GA0\GA0\F1,[F1L@@@@@@@@SD10\GA0\GA0\
F1,[F1,S@@@@@@@@D1LSD1LSD1LSD1LSD1LSD0@@@@@@@@@a') ; colorMapFromArray:#[0 0 0 0 80 112 0 80 128 0 96 128 0 96 144 0 112 144 0 112 160 16 112 144 16 128 160 16 128 176 16 144 192 32 80 80 32 96 80 32 96 96 48 112 112 48 128 112 48 128 128 64 96 96 64 144 128 80 80 80 112 112 0 128 128 0 128 128 128 160 160 0 176 176 0 192 192 192 208 208 0 224 224 224 240 240 240 255 255 129 255 255 193 255 255 225]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1)); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@C@@@G @@O0@@_8@@?<@A?>@C??@G?? O??0G??8???0??? ???@??>@??<@??<@??<@??<@??<@??<@??<@??<@') ; yourself); yourself]
! !

!AbstractSettingsApplication::StyleSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::StyleSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::StyleSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::StyleSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'ViewStyle Selection'
          name: 'ViewStyle Selection'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 562 661)
        )
        component: 
       (SpecCollection
          collection: (
           (VariableVerticalPanelSpec
              name: 'VariableVerticalPanel1'
              layout: (LayoutFrame 0 0.0 0 0 0 1.0 -35 1)
              component: 
             (SpecCollection
                collection: (
                 (ViewSpec
                    name: 'Box1'
                    component: 
                   (SpecCollection
                      collection: (
                       (TextEditorSpec
                          name: 'TextEditor1'
                          layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
                          style: (FontDescription arial medium roman 9)
                          model: noticeLabelHolder
                          hasHorizontalScrollBar: true
                          hasVerticalScrollBar: true
                          isReadOnly: true
                          hasKeyboardFocusInitially: false
                          viewClassName: 'TextView'
                          postBuildCallback: postBuildHelpLabel:
                        )
                       )
                     
                    )
                  )
                 (ViewSpec
                    name: 'Box2'
                    component: 
                   (SpecCollection
                      collection: (
                       (VerticalPanelViewSpec
                          name: 'VerticalPanel1'
                          layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
                          horizontalLayout: fit
                          verticalLayout: topFit
                          horizontalSpace: 3
                          verticalSpace: 3
                          component: 
                         (SpecCollection
                            collection: (
                             (CheckBoxSpec
                                label: 'standard styles only'
                                name: 'CheckBox1'
                                model: showStandardStylesOnly
                                translateLabel: true
                                extent: (Point 562 35)
                              )
                             (SequenceViewSpec
                                name: 'StyleList'
                                model: selectedStyle
                                hasHorizontalScrollBar: true
                                hasVerticalScrollBar: true
                                doubleClickSelector: doubleClickAt:
                                useIndex: false
                                sequenceList: styleList
                                extent: (Point 562 353)
                              )
                             )
                           
                          )
                        )
                       )
                     
                    )
                  )
                 )
               
              )
              handles: (Any 0.37 1.0)
            )
           (ViewSpec
              name: 'Box3'
              layout: (LayoutFrame 0 0 -35 1 0 1 0 1)
              component: 
             (SpecCollection
                collection: (
                 (LabelSpec
                    label: 'Label'
                    name: 'Label1'
                    layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
                    translateLabel: true
                    labelChannel: infoLabelHolder
                    resizeForLabel: true
                    adjust: left
                  )
                 (CheckBoxSpec
                    label: 'Preview'
                    name: 'CheckBox2'
                    layout: (LayoutFrame 417 0 9 0 553 0 31 0)
                    model: previewVisibleHolder
                    translateLabel: true
                  )
                 )
               
              )
            )
           (LabelSpec
              label: 'Preview'
              name: 'PreviewLabel'
              layout: (LayoutFrame 29 0 39 0 129 0 61 0)
              level: 0
              borderWidth: 1
              visibilityChannel: previewVisibleHolder
              backgroundColor: (Color 86.999313344015 86.999313344015 86.999313344015)
              translateLabel: true
            )
           (NonScrollableArbitraryComponentSpec
              name: 'Preview'
              layout: (LayoutFrame 27 0 63 0 444 0 240 0)
              level: 1
              visibilityChannel: previewVisibleHolder
              hasBorder: false
              component: ImageView
            )
           (ActionButtonSpec
              label: 'closePreviewButtonImage'
              name: 'ClosePreviewButton'
              layout: (LayoutFrame 423 0 41 0 443 0 63 0)
              visibilityChannel: previewVisibleHolder
              hasCharacterOrientedLabel: false
              translateLabel: true
              model: closePreview
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::StyleSettingsAppl methodsFor:'actions'!

basicReadSettings
    "nothing done here"
!

basicSaveSettings
    |newStyle|

    newStyle := self selectedStyle value.

    self withWaitCursorDo:[
        Transcript showCR:'Change style to ' , newStyle , ' ...'.
        View defaultStyle:newStyle asSymbol.
    ].
    self reopenToolsAfterChangedViewStyleSetting.
!

closePreview
    self previewVisibleHolder value:false.
!

doubleClickAt:aLine

    self saveSettings.
! !

!AbstractSettingsApplication::StyleSettingsAppl methodsFor:'aspects'!

infoLabelHolder

    infoLabelHolder isNil ifTrue:[
        infoLabelHolder := '' asValue.
    ].
    ^ infoLabelHolder.
!

noticeLabelHolder

    noticeLabelHolder isNil ifTrue:[
        noticeLabelHolder := '' asValue.
    ].
    ^ noticeLabelHolder.
!

previewVisibleHolder

    previewVisibleHolder isNil ifTrue:[
        previewVisibleHolder := ValueHolder new.
        previewVisibleHolder onChangeSend:#changeInfoLabel to:self.
    ].
    ^ previewVisibleHolder.
!

selectedStyle

    selectedStyle isNil ifTrue:[
        selectedStyle := ValueHolder new.
        selectedStyle addDependent:self.
    ].
    ^ selectedStyle.
!

showStandardStylesOnly

    showStandardStylesOnly isNil ifTrue:[
        showStandardStylesOnly := true asValue.
        showStandardStylesOnly addDependent:self.
    ].
    ^ showStandardStylesOnly.
!

styleList

    styleList isNil ifTrue:[
        styleList := List new.
        styleList addDependent:self.
    ].
    ^ styleList.
! !

!AbstractSettingsApplication::StyleSettingsAppl methodsFor:'change & update'!

changeInfoLabel
    |nm sheet comment previewFile previewImage imgView labelView|

    comment := ''.
    nm := self selectedStyle value.
    nm notNil ifTrue:[
        sheet := ViewStyle fromFile:(nm , '.style').
        comment := (sheet at:#comment ifAbsent:'') withoutSeparators.
        previewFile := sheet at:#previewFileName ifAbsent:nil.
    ].
    comment := comment withCRs asStringCollection.
    comment size == 1 ifTrue:[
        comment := comment first
    ].
    self infoLabelHolder value:comment.

    self previewVisibleHolder value ifTrue:[
        self builder notNil ifTrue:[
            labelView := self componentAt:#PreviewLabel. 
            labelView label:'Sorry - no preview available'.

            imgView := (self componentAt:#Preview).
            imgView image:nil.

            previewFile notEmptyOrNil ifTrue:[
                previewImage := Image fromFile:'../../doc/online/pictures' asFilename / previewFile.
                previewImage notNil ifTrue:[
                    labelView label:'Preview'.
                    imgView adjust:#fitBig; image:previewImage.
                ]
            ].
            labelView forceResizeHorizontally.     
        ]
    ]
!

update:something with:aParameter from:changedObject 
    changedObject == self showStandardStylesOnly ifTrue:[
        self updateList.
        ^ self
    ].
    changedObject == self selectedStyle ifTrue:[
        self changeInfoLabel.
        self updateModifiedChannel.
        ^ self
    ].
    super 
        update:something
        with:aParameter
        from:changedObject
!

updateList

    |listOfStyles lastSelection|

    lastSelection := self selectedStyle value.
    listOfStyles := styleDirectoryContents select:[:aFileName | aFileName asFilename hasSuffix:'style'].
    listOfStyles := listOfStyles collect:[:aFileName | aFileName asFilename nameWithoutSuffix].
    Filename isCaseSensitive ifFalse:[
        listOfStyles := listOfStyles collect:[:aStyleName | aStyleName asLowercase].
    ].
    listOfStyles remove:'generic' ifAbsent:nil; remove:'mswindows3' ifAbsent:nil.
    self showStandardStylesOnly value ifTrue:[
        listOfStyles := listOfStyles select:[:aStyleName | self class standardStyles includes:aStyleName asLowercase].
    ].

    listOfStyles sort.
    self styleList contents:listOfStyles.
    self selectedStyle value:lastSelection.

    "Modified: / 07-11-2006 / 13:58:09 / cg"
! !

!AbstractSettingsApplication::StyleSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/styleSettings.html'
! !

!AbstractSettingsApplication::StyleSettingsAppl methodsFor:'initialization & release'!

commonPostBuild
    super commonPostBuild.
    self changeInfoLabel
!

commonPostBuildWith:aBuilder
    super commonPostBuildWith:aBuilder.
!

initialize

    |someRsrcFile resourceDir|

    super initialize.

    someRsrcFile := Smalltalk getSystemFileName:('resources' asFilename constructString:'normal.style').
    someRsrcFile isNil ifTrue:[
        someRsrcFile := Smalltalk getResourceFileName:'normal.style' forPackage:'stx:libview'.
        someRsrcFile isNil ifTrue:[
            someRsrcFile := Smalltalk getResourceFileName:'styles/normal.style' forPackage:'stx:libview'.
        ].
    ].
    someRsrcFile notNil ifTrue:[
        resourceDir := someRsrcFile asFilename directoryName
    ] ifFalse:[
        resourceDir := Smalltalk getSystemFileName:'resources'.
        resourceDir isNil ifTrue:[
            self warn:'no styles found (missing ''resources'' directory)'.
            ^ self
        ].
    ].

    [
        styleDirectoryContents := resourceDir asFilename directoryContents.
    ] on:FileStream openErrorSignal do:[:ex|
        self warn:'no styles found (unaccessable ''resources'' directory)'.
        ^ self
    ].

    self updateList.
    (self class standardStyles includes:View defaultStyle asLowercase) ifFalse:[
        self showStandardStylesOnly value:false
    ].
    self selectedStyle value:(View defaultStyle).
    self noticeLabelHolder value:(resources at:'STYLE_MSG' default:'Select a Style') withCRs.    
!

postBuildHelpLabel:aWidget
    aWidget level:0.
    aWidget scrolledView backgroundColor:self window viewBackground.
! !

!AbstractSettingsApplication::StyleSettingsAppl methodsFor:'queries'!

hasUnsavedChanges

    ^  (self selectedStyle value ~= View defaultStyle)
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl class methodsFor:'defaults'!

emphasisList

    ^ #(
        #normal         
        #underline       
        #'red underline'  
        #underwave 
        #'red underwave' 
        #bold   
        #boldUnderline  
        #'bold+red underline'
        #boldUnderwave 
        #'bold+red underwave'
        #italic
        #italicUnderline
        #'italic+red underline'
        #italicUnderwave 
        #'italic+red underwave'
        #reverse
    )
!

exampleText

    ^  'methodSelector:methodArg
    "method comment:
     some stupid code to show the current settings"

    |methodVar|

    "/ another comment ...
    self at:methodArg.        "/ a message
    self fooBarBaz:methodVar. "/ a bad message
    methodVar := Array new:1.
    unknonVar := 1.           "/ a bad variable
    UnknonVar := 1.           "/ another bad variable
    "self bar:methodVar.  detect commented code easily"
    1 to:5 do:[:i | self at:i + 1].
    Transcript showCR:''some string'' , #someSymbol.
    ^ self.
'.
!

fontList

    ^ #(
        normal
        underline
        #'red underline'
        underwave
        #'red underwave'
        bold
        boldUnderline
        #'bold+red underline'
        boldUnderwave
        #'bold+red underwave'
        italic
        italicUnderline
        #'italic+red underline'
        italicUnderwave
        #'italic+red underwave'
        reverse
    )
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::SyntaxColorSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth4Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
DQDQDQDQDQDQDQDTQDQDQDQDQDQDPQQ@QDADQBP$QDP!!E@QDQ@QDIBQDP$DTADQDADQDQDQBPQPDQDPDQDQDQBQAE@QDQ@QDQDQDIDDTADQDADQDQDIDPQPD
QDPDQDQDP$QAEDADPDQDQDP$QDDTQDQDQDQDQDQDPQQDADQDQDQDQDQAEDADQDQDQDQDQDDTPDQ@QDADQDQDPQP@A@PDA@Q@QDQAEDADA@PDADQDQDDTPDPD
A@PDQDQDPQQ@QDADPDQ@QDQAEDQDQDQDQDQDQDDTMCP4MCP4QDQDPQQCP4MCP4MDQDQADQDQDQDQDQDQDQDb') ; colorMapFromArray:#[0 0 0 88 88 88 0 0 255 255 0 0 255 255 255]; mask:((Depth1Image new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'???<???<???<???<???<???<???<???<???<???<???<???<???<???<???<???<???<???<???<???<???<???<') ; yourself); yourself]
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::SyntaxColorSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::SyntaxColorSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::SyntaxColorSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Syntax Color Settings'
          name: 'Syntax Color Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 695 609)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fit
              verticalLayout: topSpace
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (ViewSpec
                    name: 'ElementSelectionBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Element:'
                          name: 'Label4'
                          layout: (LayoutFrame 0 0 0 0 100 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (ComboListSpec
                          name: 'ComboList3'
                          layout: (LayoutFrame 100 0 0 0 0 1 22 0)
                          enableChannel: syntaxColoring
                          model: syntaxElementSelection
                          comboList: syntaxElementList
                          useIndex: false
                          hidePullDownMenuButton: false
                        )
                       )
                     
                    )
                    extent: (Point 695 25)
                  )
                 (ViewSpec
                    name: 'ColorBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Color:'
                          name: 'Label2'
                          layout: (LayoutFrame 40 0 0 0 140 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (ColorMenuSpec
                          name: 'ColorMenu2'
                          layout: (LayoutFrame 140 0 0 0 0 1 22 0)
                          enableChannel: syntaxColoring
                          model: syntaxColor
                          labelsAreColored: true
                        )
                       )
                     
                    )
                    extent: (Point 695 25)
                  )
                 (ViewSpec
                    name: 'EmphasisBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (LabelSpec
                          label: 'Emphasis:'
                          name: 'Label1'
                          layout: (LayoutFrame 40 0 0 0 140 0 22 0)
                          translateLabel: true
                          adjust: right
                        )
                       (ComboListSpec
                          name: 'ComboList5'
                          layout: (LayoutFrame 140 0 0 0 0 1 22 0)
                          enableChannel: syntaxColoring
                          model: syntaxEmphasisSelection
                          comboList: syntaxEmphasisList
                          useIndex: false
                          hidePullDownMenuButton: false
                        )
                       )
                     
                    )
                    extent: (Point 695 25)
                  )
                 (ViewSpec
                    name: 'ResetBox'
                    component: 
                   (SpecCollection
                      collection: (
                       (ActionButtonSpec
                          label: 'Reset To:'
                          name: 'Button2'
                          layout: (LayoutFrame 0 0 -22 1 150 0 0 1)
                          translateLabel: true
                          model: resetToColorScheme
                          enableChannel: syntaxColoring
                        )
                       (ComboListSpec
                          name: 'ComboList4'
                          layout: (LayoutFrame 150 0 -22 1 0 1 0 1)
                          enableChannel: syntaxColoring
                          model: resetListSelection
                          comboList: resetList
                          useIndex: false
                          hidePullDownMenuButton: false
                        )
                       )
                     
                    )
                    extent: (Point 695 35)
                  )
                 (ViewSpec
                    name: 'SpacingBox1'
                    extent: (Point 695 10)
                  )
                 (LabelSpec
                    label: 'Sample Output:'
                    name: 'SampleLabel3'
                    translateLabel: true
                    adjust: left
                    extent: (Point 695 22)
                  )
                 (TextEditorSpec
                    name: 'TextEditor2'
                    enableChannel: syntaxColoring
                    model: coloredText
                    hasHorizontalScrollBar: true
                    hasVerticalScrollBar: true
                    isReadOnly: true
                    extent: (Point 695 280)
                  )
                 (ViewSpec
                    name: 'SpacingBox2'
                    extent: (Point 695 10)
                  )
                 (CheckBoxSpec
                    label: 'Syntax Coloring'
                    name: 'CheckBox1'
                    model: syntaxColoring
                    translateLabel: true
                    extent: (Point 695 22)
                  )
                 (CheckBoxSpec
                    label: 'Immediate Selector Check'
                    name: 'ImmediateSelectorCheckBox'
                    enableChannel: syntaxColoring
                    model: fullSelectorCheck
                    translateLabel: true
                    extent: (Point 695 22)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl methodsFor:'actions'!

basicReadSettings
    |colorList resetListLoc|

    oldUserPreferences notNil ifTrue:[
        (UserPreferences reset; current) addAll:oldUserPreferences
    ].

    self 
        readAspects:
            #( 
                syntaxColoring
                fullSelectorCheck
            )
        from:currentUserPrefs.

    oldUserPreferences := currentUserPrefs copy.
    colorList := UserPreferences syntaxColorNames.
    resetListLoc := currentUserPrefs listOfPredefinedSyntaxColoringSchemes 
                collect:[:entry | entry second].
    self resetList value:resetListLoc.
    self resetListSelection value:resetListLoc first.
    self syntaxEmphasisList value:self class emphasisList.
    self syntaxElementList value:colorList.
    self syntaxElementSelection value:(colorList at:1).
!

basicSaveSettings

    oldUserPreferences := currentUserPrefs copy.
    currentUserPrefs syntaxColoring:self syntaxColoring value.
    currentUserPrefs at:#fullSelectorCheck put:self fullSelectorCheck value.
!

recolor
    |text|

    self syntaxColoring value ifTrue:[
        text := SyntaxHighlighter 
                    formatMethod:self class exampleText 
                    in:nil
                    using:currentUserPrefs.
    ] ifFalse:[
        text := self class exampleText.
    ].
    self coloredText value:text
!

resetToColorScheme
    |resetSelector|

    resetSelector := resetListDictionary 
                        keyAtValue:(self resetListSelection value).
    currentUserPrefs perform:resetSelector.
    self recolor.
    self updateModifiedChannel
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl methodsFor:'aspects'!

coloredText

    coloredText isNil ifTrue:[
        coloredText := ValueHolder new.
    ].
    ^ coloredText.
!

fullSelectorCheck

    fullSelectorCheck isNil ifTrue:[
        fullSelectorCheck := currentUserPrefs fullSelectorCheck asValue.
        fullSelectorCheck onChangeSend:#updateModifiedChannel to:self
    ].
    ^ fullSelectorCheck.
!

resetList

    resetList isNil ifTrue:[
        resetList := ValueHolder new.
    ].
    ^ resetList.

    "Modified: / 08-09-2006 / 16:00:58 / cg"
!

resetListSelection

    resetListSelection isNil ifTrue:[
        resetListSelection := ValueHolder new.
    ].
    ^ resetListSelection.
!

syntaxColor

    syntaxColor isNil ifTrue:[
        syntaxColor := ValueHolder new.
        syntaxColor addDependent:self.
    ].
    ^ syntaxColor.
!

syntaxColoring

    syntaxColoring isNil ifTrue:[
        syntaxColoring := true asValue.
        syntaxColoring addDependent:self.
        syntaxColoring onChangeSend:#updateModifiedChannel to:self.
    ].
    ^ syntaxColoring.
!

syntaxElementList
    syntaxElementList isNil ifTrue:[
        syntaxElementList := ValueHolder new.
    ].
    ^ syntaxElementList.

    "Modified: / 08-09-2006 / 16:01:05 / cg"
!

syntaxElementSelection

    syntaxElementSelection isNil ifTrue:[
        syntaxElementSelection := ValueHolder new.
        syntaxElementSelection addDependent:self.
    ].
    ^ syntaxElementSelection.

    "Modified: / 08-09-2006 / 16:01:08 / cg"
!

syntaxEmphasisList
    syntaxEmphasisList isNil ifTrue:[
        syntaxEmphasisList := ValueHolder new.
    ].
    ^ syntaxEmphasisList.

    "Modified: / 08-09-2006 / 16:01:13 / cg"
!

syntaxEmphasisSelection

    syntaxEmphasisSelection isNil ifTrue:[
        syntaxEmphasisSelection := ValueHolder new.
        syntaxEmphasisSelection addDependent:self.
    ].
    ^ syntaxEmphasisSelection.
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl methodsFor:'change & update'!

getEmphasis:anEmphasisOrSymbol
    " return emphasis Symbol for emphasis or emphasis for emphasis symbol "

    ^ emphasisDictionary at:anEmphasisOrSymbol ifAbsent:[nil]
!

syntaxColorChanged
    currentUserPrefs at:(self syntaxColorSelector) put:(self syntaxColor value).
    self recolor.
    self updateModifiedChannel
!

syntaxElementSelectionChanged

    | syntaxEmphasisValue |

    self syntaxColor value:(currentUserPrefs perform:(self syntaxColorSelector)).
    syntaxEmphasisValue := (currentUserPrefs perform:(self syntaxEmphasisSelector)).
    self syntaxEmphasisSelection value:(self getEmphasis:syntaxEmphasisValue).
    self recolor.
!

syntaxEmphasisSelectionChanged
    |em|

    em := self getEmphasis:self syntaxEmphasisSelection value.
    currentUserPrefs at:(self syntaxEmphasisSelector) put:em.
    self recolor.
    self updateModifiedChannel
!

update:something with:aParameter from:changedObject
    changedObject == self syntaxElementSelection ifTrue:[
        self syntaxElementSelectionChanged.
        ^ self.
    ].
    changedObject == self syntaxColor ifTrue:[
        self syntaxColorChanged.
        ^ self.
    ].
    changedObject == self syntaxEmphasisSelection ifTrue:[
        self syntaxEmphasisSelectionChanged.
        ^ self.
    ].
    changedObject == self syntaxColoring ifTrue:[
        self recolor.
        ^ self.
    ].

    super update:something with:aParameter from:changedObject
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/sourceSettings.html'
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl methodsFor:'initialization & release'!

initialize
    self initializeEmphasisDictionary.
    super initialize.

    resetListDictionary := Dictionary new.
    currentUserPrefs listOfPredefinedSyntaxColoringSchemes do:[:entry | 
        resetListDictionary at:(entry at:1) put:(entry at:2)
    ].
!

initializeEmphasisDictionary

    emphasisDictionary := Dictionary new.
    self class emphasisList do:[ : entry |
        entry == #'red underline' ifTrue:[
            emphasisDictionary at:entry put:(Array with:#underline with:(#underlineColor->Color red)).
            emphasisDictionary at:(Array with:#underline with:(#underlineColor->Color red)) put:entry.
        ] ifFalse:[
            entry == #'red underwave' ifTrue:[
                emphasisDictionary at:entry put:(Array with:#underwave with:(#underlineColor->Color red)).
                emphasisDictionary at:(Array with:#underwave with:(#underlineColor->Color red)) put:entry.
            ] ifFalse:[
                entry == #'bold+red underline' ifTrue:[
                    emphasisDictionary at:entry put:(Array with:#bold with:#underline with:(#underlineColor->Color red)).
                    emphasisDictionary at:(Array with:#bold with:#underline with:(#underlineColor->Color red)) put:entry.
                ] ifFalse:[
                    entry == #'bold+red underwave' ifTrue:[
                        emphasisDictionary at:entry put:(Array with:#bold with:#underwave with:(#underlineColor->Color red)).
                        emphasisDictionary at:(Array with:#bold with:#underwave with:(#underlineColor->Color red)) put:entry.
                    ] ifFalse:[
                        entry == #'italic+red underline' ifTrue:[
                            emphasisDictionary at:entry put:(Array with:#italic with:#underline with:(#underlineColor->Color red)).
                            emphasisDictionary at:(Array with:#italic with:#underline with:(#underlineColor->Color red)) put:entry.
                        ] ifFalse:[
                            entry == #'italic+red underwave' ifTrue:[
                                emphasisDictionary at:entry put:(Array with:#italic with:#underwave with:(#underlineColor->Color red)).
                                emphasisDictionary at:(Array with:#italic with:#underwave with:(#underlineColor->Color red)) put:entry.
                            ] ifFalse:[
                                emphasisDictionary at:entry put:entry
                            ]
                        ]
                    ]
                ]
            ]
        ]
    ].
!

release

    oldUserPreferences notNil ifTrue:[
        (UserPreferences reset; current) addAll:oldUserPreferences
    ].
    super release
! !

!AbstractSettingsApplication::SyntaxColorSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    |colorList colorPerformer emphasisPerformer|

    colorList := UserPreferences syntaxColorNames.
    colorList do:[:syntaxElement |
        colorPerformer := (self syntaxColorSelectorForElement:syntaxElement).
        emphasisPerformer := (self syntaxEmphasisSelectorForElement:syntaxElement).
        ((oldUserPreferences perform:colorPerformer) ~= (currentUserPrefs perform:colorPerformer)) ifTrue:[
            ^ true
        ].
        ((oldUserPreferences perform:emphasisPerformer) ~= (currentUserPrefs perform:emphasisPerformer)) ifTrue:[
            ^ true
        ].
        syntaxElement
    ].

    (self
        hasChangedAspectIn:
            #(
                syntaxColoring
                fullSelectorCheck
            )
        asComparedTo:currentUserPrefs) ifTrue:[^ true].

    ^ false
!

syntaxColorSelector
    ^ (self syntaxColorSelectorForElement:self syntaxElementSelection value) 
!

syntaxColorSelectorForElement:aSyntaxElement
    ^ (aSyntaxElement replChar:$  withString: '') asLowercaseFirst asSymbol
!

syntaxEmphasisSelector 

    ^ self syntaxEmphasisSelectorForElement:(self syntaxElementSelection value) 
!

syntaxEmphasisSelectorForElement:anEmElement 
    ^ (((self syntaxColorSelectorForElement:anEmElement) readStream upToAll: 'Color'), 'Emphasis') 
        asLowercaseFirst asSymbol
! !

!AbstractSettingsApplication::SystemBrowserSettingsAppl class methodsFor:'image specs'!

defaultIcon
    <resource: #programImage>

    ^ ToolbarIconLibrary systemBrowser24x24Icon

    "Modified: / 17-09-2007 / 11:35:15 / cg"
! !

!AbstractSettingsApplication::SystemBrowserSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::SystemBrowserSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::SystemBrowserSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::SystemBrowserSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Tool Settings'
          name: 'Tool Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 607 786)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0 0 1.0 342 0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Show Accept/Cancel Bar in Editor'
                    name: 'ShowAcceptCancelBarInBrowser'
                    model: showAcceptCancelBarInBrowser
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Show Search Bar in Browser'
                    name: 'ShowSearchBarInBrowser'
                    model: useSearchBarInBrowser
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::SystemBrowserSettingsAppl methodsFor:'actions'!

basicReadSettings
    self 
        readAspects:
            #( 
                showAcceptCancelBarInBrowser
                useSearchBarInBrowser
            )
        from:currentUserPrefs.
!

basicSaveSettings
    self 
        writeAspects:
            #( 
                showAcceptCancelBarInBrowser
                useSearchBarInBrowser
            )
        to:currentUserPrefs.
! !

!AbstractSettingsApplication::SystemBrowserSettingsAppl methodsFor:'aspects'!

showAcceptCancelBarInBrowser
    showAcceptCancelBarInBrowser isNil ifTrue:[
        showAcceptCancelBarInBrowser := false asValue.
        showAcceptCancelBarInBrowser onChangeSend:#updateModifiedChannel to:self
    ].
    ^ showAcceptCancelBarInBrowser.
!

useSearchBarInBrowser
    "true, if the search-entry fields are shown in the browser itself
     (like in firefox). False if a dialog is to be opened."

    useSearchBarInBrowser isNil ifTrue:[
        useSearchBarInBrowser := true asValue.
        useSearchBarInBrowser onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useSearchBarInBrowser.
! !

!AbstractSettingsApplication::SystemBrowserSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/browserSettings.html'
! !

!AbstractSettingsApplication::SystemBrowserSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    (self
        hasChangedAspectIn:
            #(
                showAcceptCancelBarInBrowser
                useSearchBarInBrowser
            )
        asComparedTo:currentUserPrefs) ifTrue:[^ true].
    ^ false.
! !

!AbstractSettingsApplication::SystemMessageSettingsAppl class methodsFor:'help specs'!

helpSpec
    "This resource specification was automatically generated
     by the UIHelpTool of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIHelpTool may not be able to read the specification."

    "
     UIHelpTool openOnClass:AbstractSettingsApplication::SystemMessageSettingsAppl    
    "

    <resource: #help>

    ^ super helpSpec addPairsFrom:#(

#showToolTips
''

#toolTipAutoHideDelay
''

)
! !

!AbstractSettingsApplication::SystemMessageSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::SystemMessageSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth8Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(8 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
@@@@@@@@@@@@@PDA@P@@@@@@@@@@@@@@@@@@@@@@@PHB@0D@@@@@@@@@@@@@@@@@@@@@@PHDAPLC@P@@@@@@@@@@@@@@@@@@@@DBA PGA0 @@@@@@@@@@@@@
@@@@@@@A@ XDA0\H@@@@@@@@@@@@@@@@@@@@@PHIA@(J@@@@@@@@@@@@@@@@@@@@@@DAB00MCP@@@@@@@@@@@@@@@@@@@@@@@@DN@@@@@@@@@@@@@@@@@@@@
@@@@@@@AC @@@@@@@@@@@@@@@@@@@@@@@@@@@P8@@@@@@@@@@@@@@@@@@@@@@@<OC0PNDA@@DQD@@@@@@@@@@@@@@@<RD1LTEQXVE1 XDP@@@@@@@@@@@@@O
D!!LSEATVE!!\XFAD@@@@@@@@@@@@@C1HSD1$UEAPZF1,\@@@@@@@@@@@@@@<RGQ4YF!!PTEAXVG@@@@@@@@@@@@@@OD!!4]FQ(TEAPVE!!0@@@@@@@@@@@@@C1H]
GQ$TEAPTE1\@@@@@@@@@@@@@@@<RGQ4YF!!(ZF!!TU@@@@@@@@@@@@C0<^D1LSG2@UER@ HBD"@@@@@@@@@@<OG!!LSD1< EQT HB@!!H @@@@@@@@@OC2DSD1L_
F!!(ZF!!(ZF@@@@@@@@@@@@@@ODQ0\H"H"H @@@@@@@@@@@@@a') ; colorMapFromArray:#[0 0 0 64 32 16 128 96 48 112 48 0 176 112 48 176 96 32 208 160 128 160 96 16 48 32 0 192 128 80 160 80 16 112 80 32 176 112 32 96 48 16 160 112 32 80 80 16 128 64 16 64 64 16 208 208 176 224 224 208 160 160 128 144 144 80 112 112 64 128 128 64 80 80 32 192 192 160 160 160 112 96 96 48 48 48 16 240 240 224 176 176 128 176 176 144 144 144 96 112 112 48 32 32 0]; mask:((ImageMask new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@G @@O @@_0@@_0@@_0@@_0@@_0@@G @@G @@G @@?<@A?>@A?>@A?>@A?>@A?>@A?>@A?>@G??@G??@G??@A?>@') ; yourself); yourself]
! !

!AbstractSettingsApplication::SystemMessageSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::SystemMessageSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::SystemMessageSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::SystemMessageSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Messages Settings'
          name: 'Messages Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 561 478)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
              horizontalLayout: fitSpace
              verticalLayout: topSpace
              horizontalSpace: 5
              verticalSpace: 5
              component: 
             (SpecCollection
                collection: (
                 (FramedBoxSpec
                    label: 'Info & Error Messages'
                    name: 'FramedBox1'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'VM Info Messages'
                          name: 'VMInfoMessages'
                          layout: (LayoutFrame 5 0 5 0 -5 1 27 0)
                          model: vmInfo
                          translateLabel: true
                        )
                       (CheckBoxSpec
                          label: 'VM Error Messages'
                          name: 'VMErrorMessages'
                          layout: (LayoutFrame 5 0 30 0 -5 1 52 0)
                          model: vmErrors
                          translateLabel: true
                        )
                       (CheckBoxSpec
                          label: 'Display Error Messages (Xlib, Xtlib, WinAPI ...)'
                          name: 'DisplayErrorMessages'
                          layout: (LayoutFrame 5 0 55 0 -5 1 77 0)
                          model: displayErrors
                          translateLabel: true
                        )
                       (CheckBoxSpec
                          label: 'Other Info Messages'
                          name: 'OtherInfoMessages'
                          layout: (LayoutFrame 5 0 80 0 -5 1 102 0)
                          model: classInfos
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 551 133)
                  )
                 (FramedBoxSpec
                    label: 'Audible Bell'
                    name: 'FramedBox3'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Beep Generally Enabled'
                          name: 'beepEnabled'
                          layout: (LayoutFrame 5 0 5 0 226 0 27 0)
                          model: beepEnabled
                          translateLabel: true
                        )
                       (CheckBoxSpec
                          label: 'Beep in Editor'
                          name: 'CheckBox7'
                          layout: (LayoutFrame 40 0 30 0 300 0 52 0)
                          enableChannel: beepEnabled
                          model: beepInEditor
                          translateLabel: true
                        )
                       (CheckBoxSpec
                          label: 'Beep for Info Dialogs'
                          name: 'CheckBox3'
                          layout: (LayoutFrame 40 0 55 0 300 0 77 0)
                          enableChannel: beepEnabled
                          model: beepForInfoDialog
                          translateLabel: true
                        )
                       (CheckBoxSpec
                          label: 'Beep for Warning Dialogs'
                          name: 'CheckBox4'
                          layout: (LayoutFrame 40 0 80 0 300 0 102 0)
                          enableChannel: beepEnabled
                          model: beepForWarningDialog
                          translateLabel: true
                        )
                       (CheckBoxSpec
                          label: 'Beep for Error Dialogs'
                          name: 'CheckBox5'
                          layout: (LayoutFrame 40 0 105 0 300 0 127 0)
                          enableChannel: beepEnabled
                          model: beepForErrorDialog
                          translateLabel: true
                        )
                       )
                     
                    )
                    extent: (Point 551 164)
                  )
                 (FramedBoxSpec
                    label: 'Help'
                    name: 'FramedBox4'
                    labelPosition: topLeft
                    translateLabel: true
                    component: 
                   (SpecCollection
                      collection: (
                       (CheckBoxSpec
                          label: 'Tooltips (FlyBy Help)'
                          name: 'CheckBox6'
                          layout: (LayoutFrame 5 0 5 0 -5 1 27 0)
                          activeHelpKey: showToolTips
                          model: flyByHelpActive
                          translateLabel: true
                        )
                       (InputFieldSpec
                          name: 'EntryField1'
                          layout: (LayoutFrame -72 1 5 0 -16 1 27 0)
                          enableChannel: flyByHelpActive
                          model: toolTipAutoHideDelay
                          type: timeDurationOrNil
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnPointerLeave: true
                        )
                       (LabelSpec
                          label: 'Autohide after:'
                          name: 'Label1'
                          layout: (LayoutFrame -260 1 6 0 -76 1 28 0)
                          activeHelpKey: toolTipAutoHideDelay
                          translateLabel: true
                          adjust: right
                        )
                       (LabelSpec
                          label: '(s)'
                          name: 'Label2'
                          layout: (LayoutFrame -13 1 6 0 7 1 28 0)
                          translateLabel: true
                          adjust: left
                        )
                       )
                     
                    )
                    extent: (Point 551 62)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::SystemMessageSettingsAppl methodsFor:'actions'!

aspects
    ^ #( 
                beepEnabled
                beepInEditor
                beepForInfoDialog
                beepForWarningDialog
                beepForErrorDialog
                flyByHelpActive
                toolTipAutoHideDelay
            )

    "Created: / 10-11-2010 / 12:07:42 / cg"
!

basicReadSettings
    self readAspects:(self aspects) from:currentUserPrefs.

    self vmInfo value:ObjectMemory infoPrinting.
    self vmErrors value:ObjectMemory debugPrinting.
    self classInfos value:Object infoPrinting.
    self displayErrors value:DeviceWorkstation errorPrinting.

    "Modified: / 10-11-2010 / 12:08:03 / cg"
!

basicSaveSettings

    ObjectMemory infoPrinting:self vmInfo value.
    ObjectMemory debugPrinting:self vmErrors value.
    Object infoPrinting:self classInfos value.
    DeviceWorkstation errorPrinting:self displayErrors value.

    self writeAspects:(self aspects) to:currentUserPrefs.

    "Modified: / 10-11-2010 / 12:08:14 / cg"
! !

!AbstractSettingsApplication::SystemMessageSettingsAppl methodsFor:'aspects'!

beepEnabled
    beepEnabled isNil ifTrue:[
        beepEnabled := true asValue.
        beepEnabled onChangeSend:#updateModifiedChannel to:self
    ].
    ^ beepEnabled.
!

beepForErrorDialog
    beepForErrorDialog isNil ifTrue:[
        beepForErrorDialog := currentUserPrefs beepForErrorDialog asValue.
        beepForErrorDialog onChangeSend:#updateModifiedChannel to:self
    ].
    ^ beepForErrorDialog.
!

beepForInfoDialog
    beepForInfoDialog isNil ifTrue:[
        beepForInfoDialog := currentUserPrefs beepForInfoDialog asValue.
        beepForInfoDialog onChangeSend:#updateModifiedChannel to:self
    ].
    ^ beepForInfoDialog.
!

beepForWarningDialog
    beepForWarningDialog isNil ifTrue:[
        beepForWarningDialog := currentUserPrefs beepForWarningDialog asValue.
        beepForWarningDialog onChangeSend:#updateModifiedChannel to:self
    ].
    ^ beepForWarningDialog.
!

beepInEditor
    beepInEditor isNil ifTrue:[
        beepInEditor := true asValue.
        beepInEditor onChangeSend:#updateModifiedChannel to:self
    ].
    ^ beepInEditor.
!

changeFileName

    changeFileName isNil ifTrue:[
        changeFileName := ObjectMemory nameForChanges asValue.
        changeFileName onChangeSend:#updateModifiedChannel to:self
    ].
    ^ changeFileName.
!

classInfos

    classInfos isNil ifTrue:[
        classInfos := Object infoPrinting asValue.
        classInfos onChangeSend:#updateModifiedChannel to:self
    ].
    ^ classInfos.
!

displayErrors

    displayErrors isNil ifTrue:[
        displayErrors := DeviceWorkstation errorPrinting asValue.
        displayErrors onChangeSend:#updateModifiedChannel to:self
    ].
    ^ displayErrors.
!

flyByHelpActive
    flyByHelp isNil ifTrue:[
        flyByHelp := currentUserPrefs flyByHelpActive asValue.
        flyByHelp onChangeSend:#updateModifiedChannel to:self
    ].
    ^ flyByHelp.
!

logDoits

    logDoits isNil ifTrue:[
        logDoits := Smalltalk logDoits asValue.
        logDoits onChangeSend:#updateModifiedChannel to:self
    ].
    ^ logDoits.
!

toolTipAutoHideDelay
    toolTipAutoHideDelay isNil ifTrue:[
        toolTipAutoHideDelay := 10 seconds asValue.
        toolTipAutoHideDelay onChangeSend:#updateModifiedChannel to:self
    ].
    ^ toolTipAutoHideDelay.

    "Created: / 10-11-2010 / 12:07:10 / cg"
!

updChanges

    updChanges isNil ifTrue:[
        updChanges := Class updatingChanges asValue.
        updChanges onChangeSend:#updateModifiedChannel to:self
    ].
    ^ updChanges.
!

vmErrors

    vmErrors isNil ifTrue:[
        vmErrors := ObjectMemory debugPrinting asValue.
        vmErrors onChangeSend:#updateModifiedChannel to:self
    ].
    ^ vmErrors.
!

vmInfo

    vmInfo isNil ifTrue:[
        vmInfo := ObjectMemory infoPrinting asValue.
        vmInfo onChangeSend:#updateModifiedChannel to:self
    ].
    ^ vmInfo.
! !

!AbstractSettingsApplication::SystemMessageSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/messageSettings.html'
! !

!AbstractSettingsApplication::SystemMessageSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    (self hasChangedAspectIn:(self aspects) asComparedTo:currentUserPrefs) ifTrue:[^ true].

    self vmInfo value ~= ObjectMemory infoPrinting ifTrue:[^ true].
    self vmErrors value ~= ObjectMemory debugPrinting ifTrue:[^ true].
    self classInfos value ~= Object infoPrinting ifTrue:[^ true].
    self displayErrors value ~= DeviceWorkstation errorPrinting ifTrue:[^ true].
    ^ false

    "Modified: / 10-11-2010 / 12:08:25 / cg"
! !

!AbstractSettingsApplication::ToolsSettingsAppl class methodsFor:'help specs'!

flyByHelpSpec
    "This resource specification was automatically generated
     by the UIHelpTool of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIHelpTool may not be able to read the specification."

    "
     UIHelpTool openOnClass:AbstractSettingsApplication::ToolsSettingsAppl    
    "

    <resource: #help>

    ^ super flyByHelpSpec addPairsFrom:#(

#autoRaiseTranscript
'Autoraise the Transcript window when messages are added.'

#useNewFileBrowser
'Use the new, improved FileBrowser (as opposed to the simpler, older version)'

#useNewSystemBrowser
'Use the new, improved SystemBrowser (as opposed to the simpler, older version)'

#showClockInLauncher
'Show the current time in the Launcher'

#transcriptBufferSize
'Number of lines that are remembered in the Transcript'

#useSmalltalkDocumentView
'Use the builtIn HTML-Viewer, as opposed to the systems webBrowser (firefox, internet-explorer, etc.)'
)
! !

!AbstractSettingsApplication::ToolsSettingsAppl class methodsFor:'image specs'!

defaultIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self defaultIcon inspect
     ImageEditor openOnClass:self andSelector:#defaultIcon
     Icon flushCachedIcons
    "

    <resource: #image>

    ^Icon
        constantNamed:#'AbstractSettingsApplication::ToolsSettingsAppl class defaultIcon'
        ifAbsentPut:[(Depth4Image new) width: 22; height: 22; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'
******************************@@@@@@@@@@@@@J(@@@@@@@@@@@@@* @@@F(QD@@@@@B*@@@@B((QD@@@@J(@@@@@@JLQ@@@@* @B$@@@)CD@@@B*@@
IC$J*SPP@@@J(@BH@4MCQADP@@* AR"HACQAFQD@B*@@H""H"HEG$Q@J(@@@H"H("HP9$@* @@@@@"H""HI@B*@@@@@@@@H""H@J(@@@@@@@@@H" @* @@@@
@@@@@@H0B*@@@@@@@@@@@@@J(@@@@@@@@@@@@@* @@@@@@@@@@@@B*****************************(b') ; colorMapFromArray:#[0 0 0 160 160 160 240 240 240 224 224 224 48 48 48 128 128 128 208 208 208 112 112 112 192 192 192 96 96 96 176 176 176]; mask:((Depth1Image new) width: 22; height: 22; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@?@@@?0@@_8@GO<@G3<@G?>@G??@G?? G?? C?? @?? @G? @@_ @@G @@A @@@@@@@@@@@@@@@@') ; yourself); yourself]
! !

!AbstractSettingsApplication::ToolsSettingsAppl class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:AbstractSettingsApplication::ToolsSettingsAppl andSelector:#windowSpec
     AbstractSettingsApplication::ToolsSettingsAppl new openInterface:#windowSpec
     AbstractSettingsApplication::ToolsSettingsAppl open
    "

    <resource: #canvas>

    ^ 
     #(FullSpec
        name: windowSpec
        window: 
       (WindowSpec
          label: 'Tool Settings'
          name: 'Tool Settings'
          min: (Point 10 10)
          bounds: (Rectangle 0 0 607 786)
        )
        component: 
       (SpecCollection
          collection: (
           (VerticalPanelViewSpec
              name: 'VerticalPanel2'
              layout: (LayoutFrame 0 0.0 0 0 0 1.0 437 0)
              horizontalLayout: fit
              verticalLayout: top
              horizontalSpace: 3
              verticalSpace: 3
              component: 
             (SpecCollection
                collection: (
                 (CheckBoxSpec
                    label: 'Use the New System Browser'
                    name: 'NewSystemBrowser'
                    activeHelpKey: useNewSystemBrowser
                    model: useNewSystemBrowser
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Use the New File Browser'
                    name: 'NewFileBrowser'
                    activeHelpKey: useNewFileBrowser
                    model: useNewFileBrowser
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Use the New VersionDiff Browser'
                    name: 'VersionDiffBrowser'
                    model: useNewVersionDiffBrowser
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Use the New FileTree File Dialog'
                    name: 'UseNewFileDialogCheckBox'
                    model: useNewFileDialog
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Use the New Settings Dialog'
                    name: 'UseNewSettinsApplicationCheckBox'
                    model: useNewSettingsApplication
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Use the New Process Monitor'
                    name: 'UseNewProcessMonitor'
                    model: useProcessMonitorV2
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Use the New Changes Browser (not yet recommended)'
                    name: 'ChangesBrowser'
                    model: useNewChangesBrowser
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Use Hierarchical Inspector (not yet recommended)'
                    name: 'HierarchicalInspector'
                    model: useNewInspector
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Use the Smalltalk Document Viewer'
                    name: 'UseSmalltalkDocumentViewer'
                    activeHelpKey: useSmalltalkDocumentView
                    model: useSmalltalkDocumentViewer
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (ViewSpec
                    name: 'Box2'
                    extent: (Point 607 20)
                  )
                 (CheckBoxSpec
                    label: 'Show "Tip Of The Day" at Startup'
                    name: 'CheckBox1'
                    model: showTipOfTheDayAtStartup
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (CheckBoxSpec
                    label: 'Show Clock in Launcher'
                    name: 'Clock'
                    activeHelpKey: showClockInLauncher
                    model: showClockInLauncher
                    translateLabel: true
                    extent: (Point 607 25)
                  )
                 (ViewSpec
                    name: 'Box3'
                    extent: (Point 607 19)
                  )
                 (HorizontalPanelViewSpec
                    name: 'HorizontalPanel1'
                    horizontalLayout: left
                    verticalLayout: center
                    horizontalSpace: 3
                    verticalSpace: 3
                    component: 
                   (SpecCollection
                      collection: (
                       (ViewSpec
                          name: 'Box4'
                          extent: (Point 20 10)
                        )
                       (LabelSpec
                          label: 'Transcripts Buffer Size:'
                          name: 'Label1'
                          activeHelpKey: transcriptBufferSize
                          translateLabel: true
                          resizeForLabel: true
                          adjust: right
                          useDefaultExtent: true
                        )
                       (InputFieldSpec
                          name: 'Transcripts Buffer Size'
                          activeHelpKey: transcriptBufferSize
                          model: transcriptBufferSize
                          type: number
                          immediateAccept: true
                          acceptOnReturn: true
                          acceptOnTab: true
                          acceptOnLostFocus: true
                          numChars: 8
                          acceptOnPointerLeave: true
                          extent: (Point 78 22)
                        )
                       (LabelSpec
                          label: '(Lines)'
                          name: 'Label2'
                          activeHelpKey: transcriptBufferSize
                          translateLabel: true
                          resizeForLabel: true
                          adjust: right
                          useDefaultExtent: true
                        )
                       )
                     
                    )
                    extent: (Point 607 35)
                  )
                 (CheckBoxSpec
                    label: 'Autoraise Transcript'
                    name: 'CheckBox2'
                    activeHelpKey: autoRaiseTranscript
                    model: autoRaiseTranscript
                    translateLabel: true
                    extent: (Point 607 24)
                  )
                 )
               
              )
            )
           )
         
        )
      )
! !

!AbstractSettingsApplication::ToolsSettingsAppl methodsFor:'actions'!

basicReadSettings
    self 
        readAspects:
            #( 
                useNewInspector
                useNewChangesBrowser
                useNewSystemBrowser
                useNewVersionDiffBrowser
                useNewFileBrowser
                useNewFileDialog
                useNewSettingsApplication
                useProcessMonitorV2
                useSmalltalkDocumentViewer
                showClockInLauncher
                showTipOfTheDayAtStartup
            )
        from:currentUserPrefs.

    Transcript current isExternalStream ifFalse:[
        self transcriptBufferSize value:Transcript current lineLimit.
        self autoRaiseTranscript value:Transcript current autoRaise.
    ].
!

basicSaveSettings
    |showClock launcher reopenLauncher newSystemBrowserClass transcript|

    reopenLauncher := false.

    newSystemBrowserClass := Tools::NewSystemBrowser ? NewSystemBrowser.

    self 
        writeAspects:
            #( 
                useNewInspector
                useNewChangesBrowser
                useNewVersionDiffBrowser
                useNewFileDialog
                useProcessMonitorV2
                useSmalltalkDocumentViewer
                showTipOfTheDayAtStartup
            )
        to:currentUserPrefs.

    currentUserPrefs useNewSettingsApplication ~= self useNewSettingsApplication value ifTrue:[
        currentUserPrefs useNewSettingsApplication:self useNewSettingsApplication value.
    ].

    currentUserPrefs useNewSystemBrowser ~= self useNewSystemBrowser value ifTrue:[
        currentUserPrefs useNewSystemBrowser:self useNewSystemBrowser value.
            (self useNewSystemBrowser value and:[newSystemBrowserClass isLoaded]) ifTrue:[
                newSystemBrowserClass installInLauncher.
            ] ifFalse:[
                newSystemBrowserClass removeFromLauncher.
            ].
            reopenLauncher := true.
    ].

    (Smalltalk at:#FileBrowserV2) isBehavior ifTrue:[
        currentUserPrefs useNewFileBrowser ~= self useNewFileBrowser value ifTrue:[
            currentUserPrefs useNewFileBrowser:self useNewFileBrowser value.
            (self useNewFileBrowser value and:[FileBrowserV2 isLoaded]) ifTrue:[
                FileBrowserV2 installInLauncher.
            ] ifFalse:[
                FileBrowserV2 removeFromLauncher.
            ].
            reopenLauncher := true.
        ]
    ].

    transcript := Transcript current.
    (transcript notNil and:[transcript isExternalStream not]) ifTrue:[
        transcript lineLimit:self transcriptBufferSize value.
        transcript autoRaise:self autoRaiseTranscript value.
        launcher := transcript application.
    ].

    showClock := self showClockInLauncher value.
    currentUserPrefs showClockInLauncher ~= showClock ifTrue:[
        currentUserPrefs showClockInLauncher:showClock.
        launcher notNil ifTrue:[
            showClock ifTrue:[
                launcher startClock
            ] ifFalse:[
                launcher stopClock
            ]
        ]
    ].
    Inspector := currentUserPrefs inspectorClassSetting.

    reopenLauncher ifTrue:[
        launcher notNil ifTrue:[
            launcher reopenLauncher.
        ]
    ].
! !

!AbstractSettingsApplication::ToolsSettingsAppl methodsFor:'aspects'!

autoRaiseTranscript
    autoRaiseTranscript isNil ifTrue:[
        autoRaiseTranscript := false asValue.
        autoRaiseTranscript onChangeSend:#updateModifiedChannel to:self
    ].
    ^ autoRaiseTranscript.

    "Modified: / 21-09-2006 / 00:39:54 / cg"
!

showClockInLauncher
    showClockInLauncher isNil ifTrue:[
        showClockInLauncher := false asValue.
        showClockInLauncher onChangeSend:#updateModifiedChannel to:self
    ].
    ^ showClockInLauncher.

    "Modified: / 21-09-2006 / 00:39:54 / cg"
!

showTipOfTheDayAtStartup
    showTipOfTheDayAtStartup isNil ifTrue:[
        showTipOfTheDayAtStartup := false asValue.
        showTipOfTheDayAtStartup onChangeSend:#updateModifiedChannel to:self
    ].
    ^ showTipOfTheDayAtStartup.

    "Modified: / 21-09-2006 / 00:39:54 / cg"
!

transcriptBufferSize
    transcriptBufferSize isNil ifTrue:[
        transcriptBufferSize := 600 asValue. "/ Transcript current lineLimit asValue.
        transcriptBufferSize onChangeSend:#updateModifiedChannel to:self
    ].
    ^ transcriptBufferSize.
!

useNewChangesBrowser
    useNewChangesBrowser isNil ifTrue:[
        useNewChangesBrowser := false asValue.
        useNewChangesBrowser onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useNewChangesBrowser.

    "Modified: / 21-09-2006 / 00:39:37 / cg"
!

useNewFileBrowser
    useNewFileBrowser isNil ifTrue:[
        useNewFileBrowser := true asValue.
        useNewFileBrowser onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useNewFileBrowser.

    "Modified: / 21-09-2006 / 00:39:19 / cg"
!

useNewFileDialog
    useNewFileDialog isNil ifTrue:[
        useNewFileDialog := true asValue.
        useNewFileDialog onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useNewFileDialog.
!

useNewInspector
    useNewInspector isNil ifTrue:[
        useNewInspector := false asValue.
        useNewInspector onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useNewInspector.

    "Modified: / 21-09-2006 / 00:38:41 / cg"
!

useNewSettingsApplication
    useNewSettingsApplication isNil ifTrue:[
        useNewSettingsApplication := true asValue.
        useNewSettingsApplication onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useNewSettingsApplication.
!

useNewSystemBrowser
    useNewSystemBrowser isNil ifTrue:[
        useNewSystemBrowser := true asValue.
        useNewSystemBrowser onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useNewSystemBrowser.

    "Modified: / 21-09-2006 / 00:39:02 / cg"
!

useNewVersionDiffBrowser
    useNewVersionDiffBrowser isNil ifTrue:[
        useNewVersionDiffBrowser := true asValue.
        useNewVersionDiffBrowser onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useNewVersionDiffBrowser.

    "Modified: / 21-09-2006 / 00:38:56 / cg"
!

useProcessMonitorV2
    useProcessMonitorV2 isNil ifTrue:[
        useProcessMonitorV2 := true asValue.
        useProcessMonitorV2 onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useProcessMonitorV2.

    "Modified: / 21-09-2006 / 00:38:50 / cg"
!

useSmalltalkDocumentViewer
    useSmalltalkDocumentViewer isNil ifTrue:[
        useSmalltalkDocumentViewer := nil asValue.
        useSmalltalkDocumentViewer onChangeSend:#updateModifiedChannel to:self
    ].
    ^ useSmalltalkDocumentViewer.

    "Modified: / 21-09-2006 / 00:03:13 / cg"
! !

!AbstractSettingsApplication::ToolsSettingsAppl methodsFor:'help'!

helpFilename
    ^ 'Launcher/toolSettings.html'
! !

!AbstractSettingsApplication::ToolsSettingsAppl methodsFor:'queries'!

hasUnsavedChanges
    (self
        hasChangedAspectIn:
            #(
                useNewInspector
                useNewChangesBrowser
                useNewSystemBrowser
                useNewVersionDiffBrowser
                useNewFileBrowser
                useNewFileDialog
                useNewSettingsApplication
                useProcessMonitorV2
                useSmalltalkDocumentViewer
                showClockInLauncher
                showTipOfTheDayAtStartup
            )
        asComparedTo:currentUserPrefs) ifTrue:[^ true].

    Transcript current isExternalStream ifFalse:[
        (self transcriptBufferSize value  ~= Transcript current lineLimit) ifTrue:[^ true].
        (self autoRaiseTranscript value  ~= Transcript current autoRaise) ifTrue:[^ true].
    ].
    ^ false.
! !

!AbstractSettingsApplication class methodsFor:'documentation'!

version
    ^ '$Header: /cvs/stx/stx/libtool/AbstractSettingsApplication.st,v 1.381 2011-02-09 19:40:50 cg Exp $'
!

version_CVS
    ^ '$Header: /cvs/stx/stx/libtool/AbstractSettingsApplication.st,v 1.381 2011-02-09 19:40:50 cg Exp $'
! !