Attribute VB_Name = "mod_Ymos2_16xCLIEngine"
Option Explicit
'#_#_#_#_#=#_#_#_#_#=#_#_#_#_#=#_#_#_#_#=#_#_#_#_#=#_#_#_#_#
'###########################################################
'
'Module Name : mod_Ymos2_16xCLIEngine >
'-----------------------------------------------------------
'Module Propose : Core engine for YMOS v2.0 <
'-----------------------------------------------------------
'Program Type : CLI application >
'-----------------------------------------------------------
'Application Name : YMOS v2.0 <
'-----------------------------------------------------------
'Programmer Name : Boran Robert Andrei >
'-----------------------------------------------------------
'Country : Romania <
'-----------------------------------------------------------
'E-Mail : yusaku_midory@live.com >
' yusaku_midory@yahoo.com <
'-----------------------------------------------------------
'Date : 22.09.2008 >
'-----------------------------------------------------------
'Programming Language Used : Visual Basic 6 <
'-----------------------------------------------------------
'###########################################################
'_______________________________________________________________
'======================>> API DECLARATION <<====================
'_______________________________________________________________
'API used for CLI subsystem.
'_______________________________________________________________________________________________________________________
Private Declare Function AllocConsole Lib "kernel32" () As Long
Private Declare Function FreeConsole Lib "kernel32" () As Long
Private Declare Function GetStdHandle Lib "kernel32" (ByVal nStdHandle As Long) As Long
Private Declare Function ReadConsole Lib "kernel32" Alias "ReadConsoleA" (ByVal hConsoleInput As Long, ByVal _
lpBuffer As String, ByVal nNumberOfCharsToRead As Long, _
lpNumberOfCharsRead As Long, lpReserved As Any) As Long
Private Declare Function SetConsoleMode Lib "kernel32" (ByVal _
hConsoleOutput As Long, dwMode As Long) As Long
Private Declare Function SetConsoleTextAttribute Lib _
"kernel32" (ByVal hConsoleOutput As Long, ByVal _
wAttributes As Long) As Long
Private Declare Function SetConsoleTitle Lib "kernel32" Alias _
"SetConsoleTitleA" (ByVal lpConsoleTitle As String) As Long
Private Declare Function WriteConsole Lib "kernel32" Alias _
"WriteConsoleA" (ByVal hConsoleOutput As Long, _
ByVal lpBuffer As Any, ByVal nNumberOfCharsToWrite As Long, _
lpNumberOfCharsWritten As Long, lpReserved As Any) As Long
Private Declare Function FillConsoleOutputCharacter Lib "kernel32.dll" Alias "FillConsoleOutputCharacterA" (ByVal hConsoleOutput As Long, ByVal cCharacter As Byte, _
ByVal nLength As Long, _
dwWriteCoord As COORD, _
lpNumberOfCharsWritten As Long) As Long
Private Declare Function GetConsoleScreenBufferInfo Lib "kernel32.dll" (ByVal hConsoleOutput As Long, _
lpConsoleScreenBufferInfo As CONSOLE_SCREEN_BUFFER_INFO) As Long
Private Declare Function SetConsoleCursorPosition Lib "kernel32.dll" (ByVal hConsoleOutput As Long, dwCursorPosition As COORD) As Long
Public Declare Function SetConsoleScreenBufferSize Lib "kernel32" (ByVal hConsoleOutput As Long, ByRef dwSize As COORD) As Long
'______________________________________________________________________________________________________________________________________________________________________
'API used for search engine
'_____________________________________________________________________
Private Declare Function FindClose Lib "kernel32" _
(ByVal hFindFile As Long) As Long
Private Declare Function FindFirstFile Lib "kernel32" _
Alias "FindFirstFileA" _
(ByVal lpFileName As String, _
lpFindFileData As WIN32_FIND_DATA) As Long
Private Declare Function FindNextFile Lib "kernel32" _
Alias "FindNextFileA" _
(ByVal hFindFile As Long, _
lpFindFileData As WIN32_FIND_DATA) As Long
Private Declare Function GetTickCount Lib "kernel32" () As Long
Private Declare Function lstrlen Lib "kernel32" _
Alias "lstrlenW" (ByVal lpString As Long) As Long
Public Declare Function PathMatchSpec Lib "shlwapi" _
Alias "PathMatchSpecW" _
(ByVal pszFileParam As Long, _
ByVal pszSpec As Long) As Long
'_____________________________________________________________________
'_______________________________________________________________________
'========================>> Constant Declaration <<=====================
'_______________________________________________________________________
'Space character.
Private Const spacechr As Byte = 32
'Search Engine.
Private Const vbDot = 46
Private Const MAXDWORD As Long = &HFFFFFFFF
Private Const MAX_PATH As Long = 260
Private Const INVALID_HANDLE_VALUE = -1
Private Const FILE_ATTRIBUTE_DIRECTORY = &H10
Private Const ALL_FILES = "*.*"
'Input/Output/Error handel.
Private Const STD_INPUT_HANDLE = -10&
Private Const STD_OUTPUT_HANDLE = -11&
Private Const STD_ERROR_HANDLE = -12&
'Foreground color.
Private Const FOREGROUND_BLUE = &H1
Private Const FOREGROUND_GREEN = &H2
Private Const FOREGROUND_RED = &H4
Private Const FOREGROUND_INTENSITY = &H8
'Background color.
Private Const BACKGROUND_BLUE = &H10
Private Const BACKGROUND_GREEN = &H20
Private Const BACKGROUND_RED = &H40
Private Const BACKGROUND_INTENSITY = &H80
'Handle.
Private Const ENABLE_LINE_INPUT = &H2
Private Const ENABLE_ECHO_INPUT = &H4
Private Const ENABLE_MOUSE_INPUT = &H10
Private Const ENABLE_PROCESSED_INPUT = &H1
Private Const ENABLE_WINDOW_INPUT = &H8
Private Const ENABLE_PROCESSED_OUTPUT = &H1
Private Const ENABLE_WRAP_AT_EOL_OUTPUT = &H2
'_______________________________________________________________________
'========================>> Type Declaration <<=========================
'_______________________________________________________________________
'Coordonate.
Private Type COORD
x As Integer
y As Integer
End Type
'Buffer window.
Private Type SMALL_RECT
Left As Integer
Top As Integer
Right As Integer
Bottom As Integer
End Type
'Buffer screen info.
Private Type CONSOLE_SCREEN_BUFFER_INFO
dwSize As COORD
dwCursorPosition As COORD
wAttributes As Integer
srWindow As SMALL_RECT
dwMaximumWindowSize As COORD
End Type
'Time of the file.
Private Type FILETIME
dwLowDateTime As Long
dwHighDateTime As Long
End Type
'File Properties.
Private Type WIN32_FIND_DATA
dwFileAttributes As Long
ftCreationTime As FILETIME
ftLastAccessTime As FILETIME
ftLastWriteTime As FILETIME
nFileSizeHigh As Long
nFileSizeLow As Long
dwReserved0 As Long
dwReserved1 As Long
cFileName As String * MAX_PATH
cAlternate As String * 14
End Type
'Search Engine parameter's for folders
Private Type FILE_PARAMS
bRecurse As Boolean
sFileRoot As String
sFileNameExt As String
sResult As String
sMatches As String
Count As Long
End Type
'Search Engine parameter's for files.
Private Type FILE_PARAMS_2
bRecurse As Boolean
nCount As Long
nSearched As Long
sFileNameExt As String
sFileRoot As String
End Type
'_______________________________________________________________________
'========================>> Variable Declaration <<=====================
'_______________________________________________________________________
'Variable's used for Input/Output/Error.
'_______________________________________
Private hConsoleIn As Long
Private hConsoleOut As Long
Private hConsoleErr As Long
'_______________________________________
'Variable's used for "changedir command".
' -----------------------------------------------------------------------------------
Public Is_C_Drive As Boolean 'Used to see if we are in "C:" drive
Public Is_D_Drive As Boolean 'Used to see if we are in "D:" drive
Public Is_Y_Drive As Boolean 'Used to see if we are in "<YMOS:\>" virtual drive
Public Is_L_Drive As Boolean 'Used to see if we are in a SDL drive.
Public New_Directory As String 'Used to set the new directory.
Public SDL_Directory As String 'Used to set the SDL directory.
Public Create_Directory As String 'Used to create the new directory.
Public Temporary_Path As String 'Used to hold a temporary path.
Public Folder_Path As String 'Used to extract the folder path.
Public UserInput As String 'Used to read the user input.
Public BufferLen As Long 'The buffer size.
Public TemporaryBuffer As String 'Store a temporary buffer size.
Public i As Long 'Intinerator.
'Variable's used for "math command".
'------------------------------------------------------------------------------------
Public Number1, Number2 As Double
'Variable used for "searchdir command".
'------------------------------------------------------------------------------------
Private xt As FILE_PARAMS_2
'------------------------------------------------------------------------------------
'Variable used for "runscript# command".
'------------------------------------------------------------------------------------
Public ScriptName As String
'------------------------------------------------------------------------------------
'Observation : The "<YMOS:\>" is a virtual drive and will not communicate with the windows.
' The virtual drive is create as promter for the user and do not have implication
' with the windows itself.It is use for fun only.
' The serious drive is C or D !.
'_____________________________________________________________________________________________________________
'#############################################################################################################
'_____________________________________________________End Of Declaration______________________________________
'Core engine.
Private Sub Main()
New_Console:
'Create console instance.
AllocConsole
'Set console title.
SetConsoleTitle "YMOS v2.0"
'Get all the handle input/output/error.
hConsoleIn = GetStdHandle(STD_INPUT_HANDLE)
hConsoleOut = GetStdHandle(STD_OUTPUT_HANDLE)
hConsoleErr = GetStdHandle(STD_ERROR_HANDLE)
'Check the system folder's MEMORY DATA ; YML SCRIPTS ; SDL DATA.
If DirExists(App.Path & "\MEMORY DATA") = True And DirExists(App.Path & "\YML SCRIPTS") = True And DirExists(App.Path & "\SDL DATA") = True Then
'The system folder's exist so we don't create them again.
Else
MkDir (App.Path & "\MEMORY DATA")
MkDir (App.Path & "\SDL DATA")
MkDir (App.Path & "\YML SCRIPTS")
End If
'Set the foreground color.
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_GREEN
'Intro title.
Add_Line_Feed
ConsolePrint " YMOS 2 " & vbCrLf
'Set the foreground color.
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY
ConsolePrint " _____________________________" & vbCrLf
'Set the foreground color.
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN
ConsolePrint " Author : Boran Robert Andrei " & vbCrLf
ConsolePrint " Date : " & vbCrLf
ConsolePrint " Version : v2.0 " & vbCrLf
ConsolePrint " Type : CLI-16X " & vbCrLf
ConsolePrint " License : Free " & vbCrLf
'Set the foreground color.
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY
ConsolePrint " _____________________________" & vbCrLf
Add_Line_Feed
'Set the foreground color.
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_GREEN
'Add the promter.
Add_Main_Promter
StartPoint:
'Read the user input.
UserInput = ConsoleRead()
'Phrase the user input and perform command's.
'______________________________________________
'If the user enter nothing then.
If Len(UserInput) = 0 Then
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : help
ElseIf UserInput = " help" Then
Add_Line_Feed
cmd_help
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : color f1 b1
ElseIf UserInput = " color f1 b1" Then
Add_Feed_Line
color_f1_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b2
ElseIf UserInput = " color f1 b2" Then
Add_Feed_Line
color_f1_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b3
ElseIf UserInput = " color f1 b3" Then
Add_Feed_Line
color_f1_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b4
ElseIf UserInput = " color f1 b4" Then
Add_Feed_Line
color_f1_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b5
ElseIf UserInput = " color f1 b5" Then
Add_Feed_Line
color_f1_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b6
ElseIf UserInput = " color f1 b6" Then
Add_Feed_Line
color_f1_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b7
ElseIf UserInput = " color f1 b7" Then
Add_Feed_Line
color_f1_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b8
ElseIf UserInput = " color f1 b8" Then
Add_Feed_Line
color_f1_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b9
ElseIf UserInput = " color f1 b9" Then
Add_Feed_Line
color_f1_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b10
ElseIf UserInput = " color f1 b10" Then
Add_Feed_Line
color_f1_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b11
ElseIf UserInput = " color f1 b11" Then
Add_Feed_Line
color_f1_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b12
ElseIf UserInput = " color f1 b12" Then
Add_Feed_Line
color_f1_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b13
ElseIf UserInput = " color f1 b13" Then
Add_Feed_Line
color_f1_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b14
ElseIf UserInput = " color f1 b14" Then
Add_Feed_Line
color_f1_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f1 b15
ElseIf UserInput = " color f1 b15" Then
Add_Feed_Line
color_f1_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f2 b1
ElseIf UserInput = " color f2 b1" Then
Add_Feed_Line
color_f2_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b2
ElseIf UserInput = " color f2 b2" Then
Add_Feed_Line
color_f2_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b3
ElseIf UserInput = " color f2 b3" Then
Add_Feed_Line
color_f2_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b4
ElseIf UserInput = " color f2 b4" Then
Add_Feed_Line
color_f2_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b5
ElseIf UserInput = " color f2 b5" Then
Add_Feed_Line
color_f2_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b6
ElseIf UserInput = " color f2 b6" Then
Add_Feed_Line
color_f2_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b7
ElseIf UserInput = " color f2 b7" Then
Add_Feed_Line
color_f2_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b8
ElseIf UserInput = " color f2 b8" Then
Add_Feed_Line
color_f2_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b9
ElseIf UserInput = " color f2 b9" Then
Add_Feed_Line
color_f2_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b10
ElseIf UserInput = " color f2 b10" Then
Add_Feed_Line
color_f2_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b11
ElseIf UserInput = " color f2 b11" Then
Add_Feed_Line
color_f2_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b12
ElseIf UserInput = " color f2 b12" Then
Add_Feed_Line
color_f2_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b13
ElseIf UserInput = " color f2 b13" Then
Add_Feed_Line
color_f2_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b14
ElseIf UserInput = " color f2 b14" Then
Add_Feed_Line
color_f2_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f2 b15
ElseIf UserInput = " color f2 b15" Then
Add_Feed_Line
color_f2_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f3 b1
ElseIf UserInput = " color f3 b1" Then
Add_Feed_Line
color_f3_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b2
ElseIf UserInput = " color f3 b2" Then
Add_Feed_Line
color_f3_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b3
ElseIf UserInput = " color f3 b3" Then
Add_Feed_Line
color_f3_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b4
ElseIf UserInput = " color f3 b4" Then
Add_Feed_Line
color_f3_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b5
ElseIf UserInput = " color f3 b5" Then
Add_Feed_Line
color_f3_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b6
ElseIf UserInput = " color f3 b6" Then
Add_Feed_Line
color_f3_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b7
ElseIf UserInput = " color f3 b7" Then
Add_Feed_Line
color_f3_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b8
ElseIf UserInput = " color f3 b8" Then
Add_Feed_Line
color_f3_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b9
ElseIf UserInput = " color f3 b9" Then
Add_Feed_Line
color_f3_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b10
ElseIf UserInput = " color f3 b10" Then
Add_Feed_Line
color_f3_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b11
ElseIf UserInput = " color f3 b11" Then
Add_Feed_Line
color_f3_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b12
ElseIf UserInput = " color f3 b12" Then
Add_Feed_Line
color_f3_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b13
ElseIf UserInput = " color f3 b13" Then
Add_Feed_Line
color_f3_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b14
ElseIf UserInput = " color f3 b14" Then
Add_Feed_Line
color_f3_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f3 b15
ElseIf UserInput = " color f3 b15" Then
Add_Feed_Line
color_f3_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f4 b1
ElseIf UserInput = " color f4 b1" Then
Add_Feed_Line
color_f4_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b2
ElseIf UserInput = " color f4 b2" Then
Add_Feed_Line
color_f4_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b3
ElseIf UserInput = " color f4 b3" Then
Add_Feed_Line
color_f4_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b4
ElseIf UserInput = " color f4 b4" Then
Add_Feed_Line
color_f4_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b5
ElseIf UserInput = " color f4 b5" Then
Add_Feed_Line
color_f4_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b6
ElseIf UserInput = " color f4 b6" Then
Add_Feed_Line
color_f4_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b7
ElseIf UserInput = " color f4 b7" Then
Add_Feed_Line
color_f4_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b8
ElseIf UserInput = " color f4 b8" Then
Add_Feed_Line
color_f4_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b9
ElseIf UserInput = " color f4 b9" Then
Add_Feed_Line
color_f4_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b10
ElseIf UserInput = " color f4 b10" Then
Add_Feed_Line
color_f4_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b11
ElseIf UserInput = " color f4 b11" Then
Add_Feed_Line
color_f4_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b12
ElseIf UserInput = " color f4 b12" Then
Add_Feed_Line
color_f4_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b13
ElseIf UserInput = " color f4 b13" Then
Add_Feed_Line
color_f4_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b14
ElseIf UserInput = " color f4 b14" Then
Add_Feed_Line
color_f4_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f4 b15
ElseIf UserInput = " color f4 b15" Then
Add_Feed_Line
color_f4_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f5 b1
ElseIf UserInput = " color f5 b1" Then
Add_Feed_Line
color_f5_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b2
ElseIf UserInput = " color f5 b2" Then
Add_Feed_Line
color_f5_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b3
ElseIf UserInput = " color f5 b3" Then
Add_Feed_Line
color_f5_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b4
ElseIf UserInput = " color f5 b4" Then
Add_Feed_Line
color_f5_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b5
ElseIf UserInput = " color f5 b5" Then
Add_Feed_Line
color_f5_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b6
ElseIf UserInput = " color f5 b6" Then
Add_Feed_Line
color_f5_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b7
ElseIf UserInput = " color f5 b7" Then
Add_Feed_Line
color_f5_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b8
ElseIf UserInput = " color f5 b8" Then
Add_Feed_Line
color_f5_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b9
ElseIf UserInput = " color f5 b9" Then
Add_Feed_Line
color_f5_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b10
ElseIf UserInput = " color f5 b10" Then
Add_Feed_Line
color_f5_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b11
ElseIf UserInput = " color f5 b11" Then
Add_Feed_Line
color_f5_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b12
ElseIf UserInput = " color f5 b12" Then
Add_Feed_Line
color_f5_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b13
ElseIf UserInput = " color f5 b13" Then
Add_Feed_Line
color_f5_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b14
ElseIf UserInput = " color f5 b14" Then
Add_Feed_Line
color_f5_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f5 b15
ElseIf UserInput = " color f5 b15" Then
Add_Feed_Line
color_f5_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f6 b1
ElseIf UserInput = " color f6 b1" Then
Add_Feed_Line
color_f6_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b2
ElseIf UserInput = " color f6 b2" Then
Add_Feed_Line
color_f6_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b3
ElseIf UserInput = " color f6 b3" Then
Add_Feed_Line
color_f6_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b4
ElseIf UserInput = " color f6 b4" Then
Add_Feed_Line
color_f6_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b5
ElseIf UserInput = " color f6 b5" Then
Add_Feed_Line
color_f6_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b6
ElseIf UserInput = " color f6 b6" Then
Add_Feed_Line
color_f6_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b7
ElseIf UserInput = " color f6 b7" Then
Add_Feed_Line
color_f6_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b8
ElseIf UserInput = " color f6 b8" Then
Add_Feed_Line
color_f6_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b9
ElseIf UserInput = " color f6 b9" Then
Add_Feed_Line
color_f6_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b10
ElseIf UserInput = " color f6 b10" Then
Add_Feed_Line
color_f6_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b11
ElseIf UserInput = " color f6 b11" Then
Add_Feed_Line
color_f6_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b12
ElseIf UserInput = " color f6 b12" Then
Add_Feed_Line
color_f6_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b13
ElseIf UserInput = " color f6 b13" Then
Add_Feed_Line
color_f6_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b14
ElseIf UserInput = " color f6 b14" Then
Add_Feed_Line
color_f6_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f6 b15
ElseIf UserInput = " color f6 b15" Then
Add_Feed_Line
color_f6_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f7 b1
ElseIf UserInput = " color f7 b1" Then
Add_Feed_Line
color_f7_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b2
ElseIf UserInput = " color f7 b2" Then
Add_Feed_Line
color_f7_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b3
ElseIf UserInput = " color f7 b3" Then
Add_Feed_Line
color_f7_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b4
ElseIf UserInput = " color f7 b4" Then
Add_Feed_Line
color_f7_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b5
ElseIf UserInput = " color f7 b5" Then
Add_Feed_Line
color_f7_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b6
ElseIf UserInput = " color f7 b6" Then
Add_Feed_Line
color_f7_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b7
ElseIf UserInput = " color f7 b7" Then
Add_Feed_Line
color_f7_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b8
ElseIf UserInput = " color f7 b8" Then
Add_Feed_Line
color_f7_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b9
ElseIf UserInput = " color f7 b9" Then
Add_Feed_Line
color_f7_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b10
ElseIf UserInput = " color f7 b10" Then
Add_Feed_Line
color_f7_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b11
ElseIf UserInput = " color f7 b11" Then
Add_Feed_Line
color_f7_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b12
ElseIf UserInput = " color f7 b12" Then
Add_Feed_Line
color_f7_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b13
ElseIf UserInput = " color f7 b13" Then
Add_Feed_Line
color_f7_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b14
ElseIf UserInput = " color f7 b14" Then
Add_Feed_Line
color_f7_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f7 b15
ElseIf UserInput = " color f7 b15" Then
Add_Feed_Line
color_f7_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f8 b1
ElseIf UserInput = " color f8 b1" Then
Add_Feed_Line
color_f8_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b2
ElseIf UserInput = " color f8 b2" Then
Add_Feed_Line
color_f8_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b3
ElseIf UserInput = " color f8 b3" Then
Add_Feed_Line
color_f8_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b4
ElseIf UserInput = " color f8 b4" Then
Add_Feed_Line
color_f8_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b5
ElseIf UserInput = " color f8 b5" Then
Add_Feed_Line
color_f8_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b6
ElseIf UserInput = " color f8 b6" Then
Add_Feed_Line
color_f8_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b7
ElseIf UserInput = " color f8 b7" Then
Add_Feed_Line
color_f8_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b8
ElseIf UserInput = " color f8 b8" Then
Add_Feed_Line
color_f8_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b9
ElseIf UserInput = " color f8 b9" Then
Add_Feed_Line
color_f8_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b10
ElseIf UserInput = " color f8 b10" Then
Add_Feed_Line
color_f8_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b11
ElseIf UserInput = " color f8 b11" Then
Add_Feed_Line
color_f8_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b12
ElseIf UserInput = " color f8 b12" Then
Add_Feed_Line
color_f8_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b13
ElseIf UserInput = " color f8 b13" Then
Add_Feed_Line
color_f8_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b14
ElseIf UserInput = " color f8 b14" Then
Add_Feed_Line
color_f8_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f8 b15
ElseIf UserInput = " color f8 b15" Then
Add_Feed_Line
color_f8_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f9 b1
ElseIf UserInput = " color f9 b1" Then
Add_Feed_Line
color_f9_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b2
ElseIf UserInput = " color f9 b2" Then
Add_Feed_Line
color_f9_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b3
ElseIf UserInput = " color f9 b3" Then
Add_Feed_Line
color_f9_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b4
ElseIf UserInput = " color f9 b4" Then
Add_Feed_Line
color_f9_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b5
ElseIf UserInput = " color f9 b5" Then
Add_Feed_Line
color_f9_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b6
ElseIf UserInput = " color f9 b6" Then
Add_Feed_Line
color_f9_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b7
ElseIf UserInput = " color f9 b7" Then
Add_Feed_Line
color_f9_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b8
ElseIf UserInput = " color f9 b8" Then
Add_Feed_Line
color_f9_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b9
ElseIf UserInput = " color f9 b9" Then
Add_Feed_Line
color_f9_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b10
ElseIf UserInput = " color f9 b10" Then
Add_Feed_Line
color_f9_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b11
ElseIf UserInput = " color f9 b11" Then
Add_Feed_Line
color_f9_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b12
ElseIf UserInput = " color f9 b12" Then
Add_Feed_Line
color_f9_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b13
ElseIf UserInput = " color f9 b13" Then
Add_Feed_Line
color_f9_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b14
ElseIf UserInput = " color f9 b14" Then
Add_Feed_Line
color_f9_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f9 b15
ElseIf UserInput = " color f9 b15" Then
Add_Feed_Line
color_f9_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f10 b1
ElseIf UserInput = " color f10 b1" Then
Add_Feed_Line
color_f10_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b2
ElseIf UserInput = " color f10 b2" Then
Add_Feed_Line
color_f10_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b3
ElseIf UserInput = " color f10 b3" Then
Add_Feed_Line
color_f10_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b4
ElseIf UserInput = " color f10 b4" Then
Add_Feed_Line
color_f10_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b5
ElseIf UserInput = " color f10 b5" Then
Add_Feed_Line
color_f10_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b6
ElseIf UserInput = " color f10 b6" Then
Add_Feed_Line
color_f10_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b7
ElseIf UserInput = " color f10 b7" Then
Add_Feed_Line
color_f10_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b8
ElseIf UserInput = " color f10 b8" Then
Add_Feed_Line
color_f10_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b9
ElseIf UserInput = " color f10 b9" Then
Add_Feed_Line
color_f10_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b10
ElseIf UserInput = " color f10 b10" Then
Add_Feed_Line
color_f10_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b11
ElseIf UserInput = " color f10 b11" Then
Add_Feed_Line
color_f10_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b12
ElseIf UserInput = " color f10 b12" Then
Add_Feed_Line
color_f10_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b13
ElseIf UserInput = " color f10 b13" Then
Add_Feed_Line
color_f10_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b14
ElseIf UserInput = " color f10 b14" Then
Add_Feed_Line
color_f10_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f10 b15
ElseIf UserInput = " color f10 b15" Then
Add_Feed_Line
color_f10_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f11 b1
ElseIf UserInput = " color f11 b1" Then
Add_Feed_Line
color_f11_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b2
ElseIf UserInput = " color f11 b2" Then
Add_Feed_Line
color_f11_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b3
ElseIf UserInput = " color f11 b3" Then
Add_Feed_Line
color_f11_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b4
ElseIf UserInput = " color f11 b4" Then
Add_Feed_Line
color_f11_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b5
ElseIf UserInput = " color f11 b5" Then
Add_Feed_Line
color_f11_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b6
ElseIf UserInput = " color f11 b6" Then
Add_Feed_Line
color_f11_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b7
ElseIf UserInput = " color f11 b7" Then
Add_Feed_Line
color_f11_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b8
ElseIf UserInput = " color f11 b8" Then
Add_Feed_Line
color_f11_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b9
ElseIf UserInput = " color f11 b9" Then
Add_Feed_Line
color_f11_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b10
ElseIf UserInput = " color f11 b10" Then
Add_Feed_Line
color_f11_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b11
ElseIf UserInput = " color f11 b11" Then
Add_Feed_Line
color_f11_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b12
ElseIf UserInput = " color f11 b12" Then
Add_Feed_Line
color_f11_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b13
ElseIf UserInput = " color f11 b13" Then
Add_Feed_Line
color_f11_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b14
ElseIf UserInput = " color f11 b14" Then
Add_Feed_Line
color_f11_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f11 b15
ElseIf UserInput = " color f11 b15" Then
Add_Feed_Line
color_f11_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f12 b1
ElseIf UserInput = " color f12 b1" Then
Add_Feed_Line
color_f12_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b2
ElseIf UserInput = " color f12 b2" Then
Add_Feed_Line
color_f12_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b3
ElseIf UserInput = " color f12 b3" Then
Add_Feed_Line
color_f12_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b4
ElseIf UserInput = " color f12 b4" Then
Add_Feed_Line
color_f12_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b5
ElseIf UserInput = " color f12 b5" Then
Add_Feed_Line
color_f12_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b6
ElseIf UserInput = " color f12 b6" Then
Add_Feed_Line
color_f12_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b7
ElseIf UserInput = " color f12 b7" Then
Add_Feed_Line
color_f12_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b8
ElseIf UserInput = " color f12 b8" Then
Add_Feed_Line
color_f12_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b9
ElseIf UserInput = " color f12 b9" Then
Add_Feed_Line
color_f12_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b10
ElseIf UserInput = " color f12 b10" Then
Add_Feed_Line
color_f12_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b11
ElseIf UserInput = " color f12 b11" Then
Add_Feed_Line
color_f12_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b12
ElseIf UserInput = " color f12 b12" Then
Add_Feed_Line
color_f12_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b13
ElseIf UserInput = " color f12 b13" Then
Add_Feed_Line
color_f12_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b14
ElseIf UserInput = " color f12 b14" Then
Add_Feed_Line
color_f12_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f12 b15
ElseIf UserInput = " color f12 b15" Then
Add_Feed_Line
color_f12_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f13 b1
ElseIf UserInput = " color f13 b1" Then
Add_Feed_Line
color_f13_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b2
ElseIf UserInput = " color f13 b2" Then
Add_Feed_Line
color_f13_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b3
ElseIf UserInput = " color f13 b3" Then
Add_Feed_Line
color_f13_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b4
ElseIf UserInput = " color f13 b4" Then
Add_Feed_Line
color_f13_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b5
ElseIf UserInput = " color f13 b5" Then
Add_Feed_Line
color_f13_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b6
ElseIf UserInput = " color f13 b6" Then
Add_Feed_Line
color_f13_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b7
ElseIf UserInput = " color f13 b7" Then
Add_Feed_Line
color_f13_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b8
ElseIf UserInput = " color f13 b8" Then
Add_Feed_Line
color_f13_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b9
ElseIf UserInput = " color f13 b9" Then
Add_Feed_Line
color_f13_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b10
ElseIf UserInput = " color f13 b10" Then
Add_Feed_Line
color_f13_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b11
ElseIf UserInput = " color f13 b11" Then
Add_Feed_Line
color_f13_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b12
ElseIf UserInput = " color f13 b12" Then
Add_Feed_Line
color_f13_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b13
ElseIf UserInput = " color f13 b13" Then
Add_Feed_Line
color_f13_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b14
ElseIf UserInput = " color f13 b14" Then
Add_Feed_Line
color_f13_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f13 b15
ElseIf UserInput = " color f13 b15" Then
Add_Feed_Line
color_f13_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f14 b1
ElseIf UserInput = " color f14 b1" Then
Add_Feed_Line
color_f14_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b2
ElseIf UserInput = " color f14 b2" Then
Add_Feed_Line
color_f14_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b3
ElseIf UserInput = " color f14 b3" Then
Add_Feed_Line
color_f14_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b4
ElseIf UserInput = " color f14 b4" Then
Add_Feed_Line
color_f14_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b5
ElseIf UserInput = " color f14 b5" Then
Add_Feed_Line
color_f14_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b6
ElseIf UserInput = " color f14 b6" Then
Add_Feed_Line
color_f14_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b7
ElseIf UserInput = " color f14 b7" Then
Add_Feed_Line
color_f14_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b8
ElseIf UserInput = " color f14 b8" Then
Add_Feed_Line
color_f14_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b9
ElseIf UserInput = " color f14 b9" Then
Add_Feed_Line
color_f14_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b10
ElseIf UserInput = " color f14 b10" Then
Add_Feed_Line
color_f14_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b11
ElseIf UserInput = " color f14 b11" Then
Add_Feed_Line
color_f14_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b12
ElseIf UserInput = " color f14 b12" Then
Add_Feed_Line
color_f14_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b13
ElseIf UserInput = " color f14 b13" Then
Add_Feed_Line
color_f14_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b14
ElseIf UserInput = " color f14 b14" Then
Add_Feed_Line
color_f14_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f14 b15
ElseIf UserInput = " color f14 b15" Then
Add_Feed_Line
color_f14_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'####
'command : color f15 b1
ElseIf UserInput = " color f15 b1" Then
Add_Feed_Line
color_f15_b1
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b2
ElseIf UserInput = " color f15 b2" Then
Add_Feed_Line
color_f15_b2
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b3
ElseIf UserInput = " color f15 b3" Then
Add_Feed_Line
color_f15_b3
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b4
ElseIf UserInput = " color f15 b4" Then
Add_Feed_Line
color_f15_b4
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b5
ElseIf UserInput = " color f15 b5" Then
Add_Feed_Line
color_f15_b5
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b6
ElseIf UserInput = " color f15 b6" Then
Add_Feed_Line
color_f15_b6
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b7
ElseIf UserInput = " color f15 b7" Then
Add_Feed_Line
color_f15_b7
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b8
ElseIf UserInput = " color f15 b8" Then
Add_Feed_Line
color_f15_b8
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b9
ElseIf UserInput = " color f15 b9" Then
Add_Feed_Line
color_f15_b9
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b10
ElseIf UserInput = " color f15 b10" Then
Add_Feed_Line
color_f15_b10
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b11
ElseIf UserInput = " color f15 b11" Then
Add_Feed_Line
color_f15_b11
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b12
ElseIf UserInput = " color f15 b12" Then
Add_Feed_Line
color_f15_b12
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b13
ElseIf UserInput = " color f15 b13" Then
Add_Feed_Line
color_f15_b13
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b14
ElseIf UserInput = " color f15 b14" Then
Add_Feed_Line
color_f15_b14
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color f15 b15
ElseIf UserInput = " color f15 b15" Then
Add_Feed_Line
color_f15_b15
Add_Feed_Line
Add_Main_Promter
GoTo StartPoint
'command : color
ElseIf UserInput = " color" Then
Add_Line_Feed
cmd_color
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : time
ElseIf UserInput = " time" Then
Add_Line_Feed
cmd_time
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : date
ElseIf UserInput = " date" Then
Add_Line_Feed
cmd_date
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : changedir
ElseIf UserInput = " changedir" Then
Add_Line_Feed
cmd_changedir
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : createdir
ElseIf UserInput = " createdir" Then
Add_Line_Feed
cmd_createdir
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : gotodir
ElseIf UserInput = " gotodir" Then
Add_Line_Feed
cmd_gotodir
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : math
ElseIf UserInput = " math" Then
Add_Line_Feed
cmd_math
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : searchdir
ElseIf UserInput = " searchdir" Then
Add_Line_Feed
cmd_searchdir
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : byos
ElseIf UserInput = " byos" Then
Add_Line_Feed
cmd_byos
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : delete
ElseIf UserInput = " delete" Then
Add_Line_Feed
cmd_deletep
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : move
ElseIf UserInput = " move" Then
Add_Line_Feed
cmd_move
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : copy
ElseIf UserInput = " copy" Then
Add_Line_Feed
cmd_copy
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr
ElseIf UserInput = " setattr" Then
Add_Line_Feed
cmd_setattr
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr
ElseIf UserInput = " remattr" Then
Add_Line_Feed
cmd_remattr
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : time /h:m:s
ElseIf UserInput = " time /h:m:s" Then
Add_Line_Feed
cmd_time_f1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : time /h:m:s
ElseIf UserInput = " time /h:m:s" Then
Add_Line_Feed
cmd_time_f1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : time /h:m:s am/pm
ElseIf UserInput = " time /h:m:s am/pm" Then
Add_Line_Feed
cmd_time_f2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : time /h:m
ElseIf UserInput = " time /h:m" Then
Add_Line_Feed
cmd_time_f3
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : time /h:m am/pm
ElseIf UserInput = " time /h:m am/pm" Then
Add_Line_Feed
cmd_time_f4
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : date /dd,mmmm,yyyy
ElseIf UserInput = " date /dd,mmmm,yyyy" Then
Add_Line_Feed
cmd_date_f1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : date /dddd,mmmm dd,yyyy
ElseIf UserInput = " date /dddd,mmmm dd,yyyy" Then
Add_Line_Feed
cmd_date_f2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : date /mm/dd/yyyy
ElseIf UserInput = " date /mm/dd/yyyy" Then
Add_Line_Feed
cmd_date_f3
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : date /mm.dd.yy
ElseIf UserInput = " date /mm.dd.yy" Then
Add_Line_Feed
cmd_date_f4
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : changedir /c
ElseIf UserInput = " changedir /c" Then
Add_Line_Feed
cmd_changedir_c
Add_Main_Promter
GoTo StartPoint
'command : changedir /d
ElseIf UserInput = " changedir /d" Then
Add_Line_Feed
cmd_changedir_d
Add_Main_Promter
GoTo StartPoint
'command : changedir /y
ElseIf UserInput = " changedir /y" Then
Add_Line_Feed
cmd_changedir_y
Add_Main_Promter
GoTo StartPoint
'command : changedir /lok$
ElseIf UserInput = " changedir /lok$" Then
Add_Line_Feed
cmd_changedir_lok
Add_Main_Promter
GoTo StartPoint
'command : math /x+y
ElseIf UserInput = " math /x+y" Then
Add_Line_Feed
cmd_math_t1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : math /x-y
ElseIf UserInput = " math /x-y" Then
Add_Line_Feed
cmd_math_t2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : math /x:y
ElseIf UserInput = " math /x:y" Then
Add_Line_Feed
cmd_math_t3
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : math /x*y
ElseIf UserInput = " math /x*y" Then
Add_Line_Feed
cmd_math_t4
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : searchdir /sfol /c
ElseIf UserInput = " searchdir /sfol /c" Then
Add_Line_Feed
cmd_searchdir_m1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : searchdir /sfol /d
ElseIf UserInput = " searchdir /sfol /d" Then
Add_Line_Feed
cmd_searchdir_m2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : searchdir /sfil /c
ElseIf UserInput = " searchdir /sfil /c" Then
Add_Line_Feed
cmd_searchdir_m3
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : searchdir /sfil /d
ElseIf UserInput = " searchdir /sfil /d" Then
Add_Line_Feed
cmd_searchdir_m4
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : byos /pt
ElseIf UserInput = " byos /pt" Then
Add_Line_Feed
cmd_byos_t1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : byos /np
ElseIf UserInput = " byos /np" Then
Add_Line_Feed
cmd_byos_t2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : byos /fsd
ElseIf UserInput = " byos /fsd" Then
Add_Line_Feed
cmd_byos_t3
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : byos /dsn
ElseIf UserInput = " byos /cpuu" Then
Add_Line_Feed
cmd_byos_t4
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : byos /cpus
ElseIf UserInput = " byos /cpus" Then
Add_Line_Feed
cmd_byos_t5
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : byos /mem
ElseIf UserInput = " byos /mem" Then
Add_Line_Feed
cmd_byos_t6
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : delete /fol
ElseIf UserInput = " delete /fol" Then
Add_Line_Feed
cmd_delete_c1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : delete /fil
ElseIf UserInput = " delete /fil" Then
Add_Line_Feed
cmd_delete_c2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : move /fol
ElseIf UserInput = " move /fol" Then
Add_Line_Feed
cmd_move_c1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : move /fil
ElseIf UserInput = " move /fil" Then
Add_Line_Feed
cmd_move_c2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : copy /fol
ElseIf UserInput = " copy /fol" Then
Add_Line_Feed
cmd_copy_c1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : copy /fil
ElseIf UserInput = " copy /fil" Then
Add_Line_Feed
cmd_copy_c2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr /ali
ElseIf UserInput = " setattr /ali" Then
Add_Line_Feed
cmd_setattr_m1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr /arc
ElseIf UserInput = " setattr /arc" Then
Add_Line_Feed
cmd_setattr_m2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr /dir
ElseIf UserInput = " setattr /dir" Then
Add_Line_Feed
cmd_setattr_m3
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr /hid
ElseIf UserInput = " setattr /hid" Then
Add_Line_Feed
cmd_setattr_m4
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr /nor
ElseIf UserInput = " setattr /nor" Then
Add_Line_Feed
cmd_setattr_m5
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr /reo
ElseIf UserInput = " setattr /reo" Then
Add_Line_Feed
cmd_setattr_m6
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr /sys
ElseIf UserInput = " setattr /sys" Then
Add_Line_Feed
cmd_setattr_m7
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : setattr /vol
ElseIf UserInput = " setattr /vol" Then
Add_Line_Feed
cmd_setattr_m8
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr /ali
ElseIf UserInput = " remattr /ali" Then
Add_Line_Feed
cmd_remattr_m1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr /arc
ElseIf UserInput = " remattr /arc" Then
Add_Line_Feed
cmd_remattr_m2
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr /dir
ElseIf UserInput = " remattr /dir" Then
Add_Line_Feed
cmd_remattr_m3
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr /hid
ElseIf UserInput = " remattr /hid" Then
Add_Line_Feed
cmd_remattr_m4
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr /nor
ElseIf UserInput = " remattr /nor" Then
Add_Line_Feed
cmd_remattr_m5
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr /reo
ElseIf UserInput = " remattr /reo" Then
Add_Line_Feed
cmd_remattr_m6
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr /sys
ElseIf UserInput = " remattr /sys" Then
Add_Line_Feed
cmd_remattr_m7
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : remattr /vol
ElseIf UserInput = " remattr /vol" Then
Add_Line_Feed
cmd_remattr_m8
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : createdir [name]
ElseIf Left$(UserInput, 11) = " createdir " Then
Add_Line_Feed
cmd_createdir_name
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : gotodir [name]
ElseIf Left$(UserInput, 9) = " gotodir " Then
Add_Line_Feed
cmd_gotodir_name
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : prvdir [name]
ElseIf UserInput = " prvdir" Then
Add_Line_Feed
cmd_prvdir_name
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : encryptstr
ElseIf UserInput = " encryptstr" Then
Add_Line_Feed
cmd_encryptstr_t1
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : write@
ElseIf UserInput = " write@" Then
Add_Line_Feed
cmd_write
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : read@
ElseIf UserInput = " read@" Then
Add_Line_Feed
cmd_read
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : delete@
ElseIf UserInput = " delete@" Then
Add_Line_Feed
cmd_delete
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : script#
ElseIf UserInput = " script#" Then
Add_Line_Feed
cmd_script
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : runscript#
ElseIf UserInput = " runscript#" Then
Add_Line_Feed
cmd_runscript
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : showymls
ElseIf UserInput = " showymls" Then
Add_Line_Feed
cmd_showymls
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : runexe
ElseIf UserInput = " runexe" Then
Add_Line_Feed
cmd_runexe
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : deleteymls
ElseIf UserInput = " deleteymls" Then
Add_Line_Feed
cmd_deleteymls
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : lok$
ElseIf UserInput = " lok$" Then
Add_Line_Feed
cmd_lok
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : showsdls
ElseIf UserInput = " showsdls" Then
Add_Line_Feed
cmd_showsdls
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : deletesdls
ElseIf UserInput = " deletesdls" Then
Add_Line_Feed
cmd_deletesdls
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : text2ascii
ElseIf UserInput = " text2ascii" Then
Add_Line_Feed
cmd_text2ascii
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : nrseqgen
ElseIf UserInput = " nrseqgen" Then
Add_Line_Feed
cmd_nrseqgen
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : phranalyse
ElseIf UserInput = " phranalyse" Then
Add_Line_Feed
cmd_phranalyse
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : rename
ElseIf UserInput = " rename" Then
Add_Line_Feed
cmd_rename
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : runvbs
ElseIf UserInput = " runvbs" Then
Add_Line_Feed
cmd_runvbs
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : filattr
ElseIf UserInput = " filattr" Then
Add_Line_Feed
cmd_filattr
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : cls
ElseIf UserInput = " cls" Then
FreeConsole
GoTo 2
'command : color ??
ElseIf UserInput = " COLOR ??" Then
Add_Line_Feed
cmd_color_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : changedir ??
ElseIf UserInput = " CHANGEDIR ??" Then
Add_Line_Feed
cmd_changedir_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : time ??
ElseIf UserInput = " TIME ??" Then
Add_Line_Feed
cmd_time_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : date ??
ElseIf UserInput = " DATE ??" Then
Add_Line_Feed
cmd_date_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : createdir ??
ElseIf UserInput = " CREATEDIR ??" Then
Add_Line_Feed
cmd_createdir_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : gotodir ??
ElseIf UserInput = " GOTODIR ??" Then
Add_Line_Feed
cmd_gotodir_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : prvdir ??
ElseIf UserInput = " PRVDIR ??" Then
Add_Line_Feed
cmd_prvdir_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : math ??
ElseIf UserInput = " MATH ??" Then
Add_Line_Feed
cmd_math_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : searchdir ??
ElseIf UserInput = " SEARCHDIR ??" Then
Add_Line_Feed
cmd_searchdir_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : encryptstr ??
ElseIf UserInput = " ENCRYPTSTR ??" Then
Add_Line_Feed
cmd_encryptstr_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : byos ??
ElseIf UserInput = " BYOS ??" Then
Add_Line_Feed
cmd_byos_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : write@ ??
ElseIf UserInput = " WRITE@ ??" Then
Add_Line_Feed
cmd_write_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : read@ ??
ElseIf UserInput = " READ@ ??" Then
Add_Line_Feed
cmd_read_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : delete@ ??
ElseIf UserInput = " DELETE@ ??" Then
Add_Line_Feed
cmd_delete_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : script# ??
ElseIf UserInput = " SCRIPT# ??" Then
Add_Line_Feed
cmd_script_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : runscript# ??
ElseIf UserInput = " RUNSCRIPT# ??" Then
Add_Line_Feed
cmd_runscript_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : showymls ??
ElseIf UserInput = " SHOWYMLS ??" Then
Add_Line_Feed
cmd_showymls_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : runexe ??
ElseIf UserInput = " RUNEXE ??" Then
Add_Line_Feed
cmd_runexe_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: deleteymls ??
ElseIf UserInput = " DELETEYMLS ??" Then
Add_Line_Feed
cmd_deleteymls_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: lok$ ??
ElseIf UserInput = " LOK$ ??" Then
Add_Line_Feed
cmd_lok_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: showsdls ??
ElseIf UserInput = " SHOWSDLS ??" Then
Add_Line_Feed
cmd_showsdls_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: deletesdls ??
ElseIf UserInput = " DELETESDLS ??" Then
Add_Line_Feed
cmd_deletesdls_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: text2ascii ??
ElseIf UserInput = " TEXT2ASCII ??" Then
Add_Line_Feed
cmd_text2ascii_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: nrseqgen ??
ElseIf UserInput = " NRSEQGEN ??" Then
Add_Line_Feed
cmd_nrseqgen_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: phranalyse ??
ElseIf UserInput = " PHRANALYSE ??" Then
Add_Line_Feed
cmd_phranalyse_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: rename ??
ElseIf UserInput = " RENAME ??" Then
Add_Line_Feed
cmd_rename_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: runvbs ??
ElseIf UserInput = " RUNVBS ??" Then
Add_Line_Feed
cmd_runvbs_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: delete ??
ElseIf UserInput = " DELETE ??" Then
Add_Line_Feed
cmd_deletep_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: move ??
ElseIf UserInput = " MOVE ??" Then
Add_Line_Feed
cmd_move_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: copy ??
ElseIf UserInput = " COPY ??" Then
Add_Line_Feed
cmd_copy_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: SETATTR ??
ElseIf UserInput = " SETATTR ??" Then
Add_Line_Feed
cmd_setattr_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: REMATTR ??
ElseIf UserInput = " REMATTR ??" Then
Add_Line_Feed
cmd_remattr_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command: FILATTR ??
ElseIf UserInput = " FILATTR ??" Then
Add_Line_Feed
cmd_filattr_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : cls ??
ElseIf UserInput = " CLS ??" Then
Add_Line_Feed
cmd_cls_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : help ??
ElseIf UserInput = " HELP ??" Then
Add_Line_Feed
cmd_help_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : exit ??
ElseIf UserInput = " EXIT ??" Then
Add_Line_Feed
cmd_exit_more
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
'command : exit
ElseIf UserInput = " exit" Then
GoTo ExitConsole
'If the user enter a bad command then.
Else
Add_Line_Feed
Error_Unknown_Command
Add_Line_Feed
Add_Main_Promter
GoTo StartPoint
End If
2:
GoTo New_Console
ExitConsole:
FreeConsole
End Sub
'_______________________________________________________________
'Handle subrutine's (Easy our work)
'_______________________________________________________________
'ConsolePrint subrutine.
Public Sub ConsolePrint(szOut As String)
WriteConsole hConsoleOut, szOut, Len(szOut), vbNull, vbNull
End Sub
'ConsoleRead function.
Private Function ConsoleRead() As String
Dim sUserInput As String * 256
Call ReadConsole(hConsoleIn, sUserInput, Len(sUserInput), vbNull, vbNull)
ConsoleRead = Left$(sUserInput, InStr(sUserInput, Chr$(0)) - 3)
End Function
'Add Line Feed subrutine.
Private Sub Add_Line_Feed()
ConsolePrint "" & vbCrLf
End Sub
'Add Feed Line subrutine.
Private Sub Add_Feed_Line()
ConsolePrint "" & vbCrLf
End Sub
'Add Main Promter subrutine.
Private Sub Add_Main_Promter()
If Is_C_Drive = True And Is_D_Drive = False And Is_Y_Drive = False And Is_L_Drive = False Then
ConsolePrint " " & New_Directory
ElseIf Is_C_Drive = False And Is_D_Drive = True And Is_Y_Drive = False And Is_L_Drive = False Then
ConsolePrint " " & New_Directory
ElseIf Is_C_Drive = False And Is_D_Drive = False And Is_Y_Drive = True And Is_L_Drive = False Then
ConsolePrint " " & New_Directory
ElseIf Is_C_Drive = False And Is_D_Drive = False And Is_Y_Drive = False And Is_L_Drive = True Then
ConsolePrint " " & New_Directory
Else
'Set a initial value (This must be done to prevent creating folder's in "<YMOS:\>" drive.
New_Directory = "<YMOS:\>"
ConsolePrint " " & New_Directory
End If
End Sub
'Error Unknown Command subrutine.
Private Sub Error_Unknown_Command()
ConsolePrint " Unknown command or bad command name." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "help" & Chr$(34) & " for command description." & vbCrLf
End Sub
'_______________________________________________________________________________
'Command's Section [Description/Help]
'_______________________________________________________________________________
'command : help
Private Sub cmd_help()
ConsolePrint " YMOS 2 HELP " & vbCrLf
ConsolePrint " " & vbCrLf
ConsolePrint " For more information on a specific command type [COMMAND NAME] [??] " & vbCrLf
ConsolePrint " " & vbCrLf
ConsolePrint " Example: COLOR ?? , BYOS ?? , DELETEYMLS ?? etc... " & vbCrLf
ConsolePrint " " & vbCrLf
ConsolePrint " " & vbCrLf
ConsolePrint " " & vbCrLf
ConsolePrint " changedir = Changes the current drive. " & vbCrLf
ConsolePrint " cls = Clear the screen. " & vbCrLf
ConsolePrint " color = Change the forecolor and backcolor of the screen. " & vbCrLf
ConsolePrint " copy = Copy a folder/subfolder/file. " & vbCrLf
ConsolePrint " createdir = Create a folder. " & vbCrLf
ConsolePrint " byos = Displays information about the machine component(s). " & vbCrLf
ConsolePrint " date = Displays the system date. " & vbCrLf
ConsolePrint " delete = Delete a folder/subfolder/file. " & vbCrLf
ConsolePrint " delete@ = Delete an ASCII file. " & vbCrLf
ConsolePrint " deleteymls = Delete a specific YML script. " & vbCrLf
ConsolePrint " deletesdls = Delete a specific Standard Directory Location. " & vbCrLf
ConsolePrint " exit = Close YMOS v2.0 " & vbCrLf
ConsolePrint " encryptstr = Encrypt a plaintext. " & vbCrLf
ConsolePrint " filattr = Shows file properties. " & vbCrLf
ConsolePrint " gotodir = Go to a specific folder. " & vbCrLf
ConsolePrint " help = Show the available system command(s). " & vbCrLf
ConsolePrint " lok$ = Create a Standard Directory Location (SDL). " & vbCrLf
ConsolePrint " math = Execute different type(s) of mathematical operation. " & vbCrLf
ConsolePrint " move = Move a folder/subfolder/file. " & vbCrLf
ConsolePrint " nrseqgen = Pseudo-Random Sequence Number Generator. " & vbCrLf
ConsolePrint " phranalyse = Make a word/phrase analyse. " & vbCrLf
ConsolePrint " prvdir = Go to previous folder. " & vbCrLf
ConsolePrint " read@ = Read text from an ASCII file. " & vbCrLf
ConsolePrint " rename = Rename a folder/subfolder/file. " & vbCrLf
ConsolePrint " runexe = Run an executable program. " & vbCrLf
ConsolePrint " runscript# = Run a YML script. " & vbCrLf
ConsolePrint " runvbs = Run a VB-Script file. " & vbCrLf
ConsolePrint " remattr = Remove file attributes. " & vbCrLf
ConsolePrint " script# = Create a YML script. " & vbCrLf
ConsolePrint " searchdir = Search and displays a list of folder(s)/Subfolder(s)/file(s) in a specific drive." & vbCrLf
ConsolePrint " setattr = Set file attributes. " & vbCrLf
ConsolePrint " showymls = Show a list of all available YML script's. " & vbCrLf
ConsolePrint " showsdls = Show a list of all available Standard Directory Location. " & vbCrLf
ConsolePrint " text2ascii = Show a list of ASCII character's. " & vbCrLf
ConsolePrint " time = Displays the system time. " & vbCrLf
ConsolePrint " write@ = Write text to an ASCII file. " & vbCrLf
ConsolePrint " " & vbCrLf
ConsolePrint " " & vbCrLf
End Sub
'command : color f1 b1
Private Sub color_f1_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f1 b2
Private Sub color_f1_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_RED
End Sub
'command : color f1 b3
Private Sub color_f1_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f1 b4
Private Sub color_f1_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE
End Sub
'command : color f1 b5
Private Sub color_f1_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f1 b6
Private Sub color_f1_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN
End Sub
'command : color f1 b7
Private Sub color_f1_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f1 b8
Private Sub color_f1_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f1 b9
Private Sub color_f1_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f1 b10
Private Sub color_f1_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f1 b11
Private Sub color_f1_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f1 b12
Private Sub color_f1_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f1 b13
Private Sub color_f1_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY
End Sub
'command : color f1 b14
Private Sub color_f1_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f1 b15
Private Sub color_f1_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f2 b1
Private Sub color_f2_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f2 b2
Private Sub color_f2_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_RED
End Sub
'command : color f2 b3
Private Sub color_f2_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f2 b4
Private Sub color_f2_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_BLUE
End Sub
'command : color f2 b5
Private Sub color_f2_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f2 b6
Private Sub color_f2_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f2 b7
Private Sub color_f2_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f2 b8
Private Sub color_f2_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f2 b9
Private Sub color_f2_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f2 b10
Private Sub color_f2_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f2 b11
Private Sub color_f2_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f2 b12
Private Sub color_f2_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f2 b13
Private Sub color_f2_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED
End Sub
'command : color f2 b14
Private Sub color_f2_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f2 b15
Private Sub color_f2_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f3 b1
Private Sub color_f3_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f3 b2
Private Sub color_f3_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED
End Sub
'command : color f3 b3
Private Sub color_f3_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f3 b4
Private Sub color_f3_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE
End Sub
'command : color f3 b5
Private Sub color_f3_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f3 b6
Private Sub color_f3_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN
End Sub
'command : color f3 b7
Private Sub color_f3_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f3 b8
Private Sub color_f3_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f3 b9
Private Sub color_f3_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f3 b10
Private Sub color_f3_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f3 b11
Private Sub color_f3_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f3 b12
Private Sub color_f3_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f3 b13
Private Sub color_f3_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY
End Sub
'command : color f3 b14
Private Sub color_f3_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f3 b15
Private Sub color_f3_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f4 b1
Private Sub color_f4_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f4 b2
Private Sub color_f4_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_RED
End Sub
'command : color f4 b3
Private Sub color_f4_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f4 b4
Private Sub color_f4_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_BLUE
End Sub
'command : color f4 b5
Private Sub color_f4_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f4 b6
Private Sub color_f4_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_GREEN
End Sub
'command : color f4 b7
Private Sub color_f4_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f4 b8
Private Sub color_f4_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f4 b9
Private Sub color_f4_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f4 b10
Private Sub color_f4_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f4 b11
Private Sub color_f4_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f4 b12
Private Sub color_f4_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f4 b13
Private Sub color_f4_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE
End Sub
'command : color f4 b14
Private Sub color_f4_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f4 b15
Private Sub color_f4_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f5 b1
Private Sub color_f5_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f5 b2
Private Sub color_f5_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED
End Sub
'command : color f5 b3
Private Sub color_f5_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f5 b4
Private Sub color_f5_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE
End Sub
'command : color f5 b5
Private Sub color_f5_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f5 b6
Private Sub color_f5_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN
End Sub
'command : color f5 b7
Private Sub color_f5_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f5 b8
Private Sub color_f5_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f5 b9
Private Sub color_f5_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f5 b10
Private Sub color_f5_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f5 b11
Private Sub color_f5_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f5 b12
Private Sub color_f5_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f5 b13
Private Sub color_f5_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY
End Sub
'command : color f5 b14
Private Sub color_f5_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f5 b15
Private Sub color_f5_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f6 b1
Private Sub color_f6_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f6 b2
Private Sub color_f6_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_RED
End Sub
'command : color f6 b3
Private Sub color_f6_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f6 b4
Private Sub color_f6_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f6 b5
Private Sub color_f6_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f6 b6
Private Sub color_f6_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_GREEN
End Sub
'command : color f6 b7
Private Sub color_f6_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f6 b8
Private Sub color_f6_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f6 b9
Private Sub color_f6_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f6 b10
Private Sub color_f6_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f6 b11
Private Sub color_f6_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f6 b12
Private Sub color_f6_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f6 b13
Private Sub color_f6_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN
End Sub
'command : color f6 b14
Private Sub color_f6_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f6 b15
Private Sub color_f6_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f7 b1
Private Sub color_f7_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f7 b2
Private Sub color_f7_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED
End Sub
'command : color f7 b3
Private Sub color_f7_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f7 b4
Private Sub color_f7_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE
End Sub
'command : color f7 b5
Private Sub color_f7_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f7 b6
Private Sub color_f7_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN
End Sub
'command : color f7 b7
Private Sub color_f7_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f7 b8
Private Sub color_f7_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f7 b9
Private Sub color_f7_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f7 b10
Private Sub color_f7_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f7 b11
Private Sub color_f7_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f7 b12
Private Sub color_f7_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f7 b13
Private Sub color_f7_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY
End Sub
'command : color f7 b14
Private Sub color_f7_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f7 b15
Private Sub color_f7_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f8 b1
Private Sub color_f8_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f8 b2
Private Sub color_f8_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_RED
End Sub
'command : color f8 b3
Private Sub color_f8_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f8 b4
Private Sub color_f8_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f8 b5
Private Sub color_f8_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f8 b6
Private Sub color_f8_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_GREEN
End Sub
'command : color f8 b7
Private Sub color_f8_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f8 b8
Private Sub color_f8_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f8 b9
Private Sub color_f8_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f8 b10
Private Sub color_f8_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f8 b11
Private Sub color_f8_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f8 b12
Private Sub color_f8_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f8 b13
Private Sub color_f8_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN
End Sub
'command : color f8 b14
Private Sub color_f8_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f8 b15
Private Sub color_f8_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f9 b1
Private Sub color_f9_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f9 b2
Private Sub color_f9_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED
End Sub
'command : color f9 b3
Private Sub color_f9_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f9 b4
Private Sub color_f9_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE
End Sub
'command : color f9 b5
Private Sub color_f9_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f9 b6
Private Sub color_f9_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN
End Sub
'command : color f9 b7
Private Sub color_f9_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f9 b8
Private Sub color_f9_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f9 b9
Private Sub color_f9_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f9 b10
Private Sub color_f9_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f9 b11
Private Sub color_f9_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f9 b12
Private Sub color_f9_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f9 b13
Private Sub color_f9_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY
End Sub
'command : color f9 b14
Private Sub color_f9_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f9 b15
Private Sub color_f9_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f10 b1
Private Sub color_f10_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f10 b2
Private Sub color_f10_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED
End Sub
'command : color f10 b3
Private Sub color_f10_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f10 b4
Private Sub color_f10_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_BLUE
End Sub
'command : color f10 b5
Private Sub color_f10_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f10 b6
Private Sub color_f10_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_GREEN
End Sub
'command : color f10 b7
Private Sub color_f10_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f10 b8
Private Sub color_f10_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f10 b9
Private Sub color_f10_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f10 b10
Private Sub color_f10_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f10 b11
Private Sub color_f10_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f10 b12
Private Sub color_f10_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f10 b13
Private Sub color_f10_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE
End Sub
'command : color f10 b14
Private Sub color_f10_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f10 b15
Private Sub color_f10_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f11 b1
Private Sub color_f11_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f11 b2
Private Sub color_f11_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED
End Sub
'command : color f11 b3
Private Sub color_f11_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f11 b4
Private Sub color_f11_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE
End Sub
'command : color f11 b5
Private Sub color_f11_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f11 b6
Private Sub color_f11_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN
End Sub
'command : color f11 b7
Private Sub color_f11_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f11 b8
Private Sub color_f11_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f11 b9
Private Sub color_f11_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f11 b10
Private Sub color_f11_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f11 b11
Private Sub color_f11_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f11 b12
Private Sub color_f11_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f11 b13
Private Sub color_f11_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY
End Sub
'command : color f11 b14
Private Sub color_f11_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f11 b15
Private Sub color_f11_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f12 b1
Private Sub color_f12_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f12 b2
Private Sub color_f12_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_RED
End Sub
'command : color f12 b3
Private Sub color_f12_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f12 b4
Private Sub color_f12_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_BLUE
End Sub
'command : color f12 b5
Private Sub color_f12_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f12 b6
Private Sub color_f12_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_GREEN
End Sub
'command : color f12 b7
Private Sub color_f12_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f12 b8
Private Sub color_f12_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f12 b9
Private Sub color_f12_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f12 b10
Private Sub color_f12_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f12 b11
Private Sub color_f12_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f12 b12
Private Sub color_f12_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f12 b13
Private Sub color_f12_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE
End Sub
'command : color f12 b14
Private Sub color_f12_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f12 b15
Private Sub color_f12_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f13 b1
Private Sub color_f13_b1()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f13 b2
Private Sub color_f13_b2()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_RED
End Sub
'command : color f13 b3
Private Sub color_f13_b3()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f13 b4
Private Sub color_f13_b4()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_BLUE
End Sub
'command : color f13 b5
Private Sub color_f13_b5()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f13 b6
Private Sub color_f13_b6()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_GREEN
End Sub
'command : color f13 b7
Private Sub color_f13_b7()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f13 b8
Private Sub color_f13_b8()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f13 b9
Private Sub color_f13_b9()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f13 b10
Private Sub color_f13_b10()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f13 b11
Private Sub color_f13_b11()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f13 b12
Private Sub color_f13_b12()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f13 b13
Private Sub color_f13_b13()
SetConsoleTextAttribute hConsoleOut, 0
End Sub
'command : color f13 b14
Private Sub color_f13_b14()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f13 b15
Private Sub color_f13_b15()
SetConsoleTextAttribute hConsoleOut, BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f14 b1
Private Sub color_f14_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f14 b2
Private Sub color_f14_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED
End Sub
'command : color f14 b3
Private Sub color_f14_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f14 b4
Private Sub color_f14_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_BLUE
End Sub
'command : color f14 b5
Private Sub color_f14_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f14 b6
Private Sub color_f14_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN
End Sub
'command : color f14 b7
Private Sub color_f14_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f14 b8
Private Sub color_f14_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f14 b9
Private Sub color_f14_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f14 b10
Private Sub color_f14_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f14 b11
Private Sub color_f14_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f14 b12
Private Sub color_f14_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f14 b13
Private Sub color_f14_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY
End Sub
'command : color f14 b14
Private Sub color_f14_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f14 b15
Private Sub color_f14_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or FOREGROUND_INTENSITY Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'####
'command : color f15 b1
Private Sub color_f15_b1()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_INTENSITY
End Sub
'command : color f15 b2
Private Sub color_f15_b2()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED
End Sub
'command : color f15 b3
Private Sub color_f15_b3()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f15 b4
Private Sub color_f15_b4()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_BLUE
End Sub
'command : color f15 b5
Private Sub color_f15_b5()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f15 b6
Private Sub color_f15_b6()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_GREEN
End Sub
'command : color f15 b7
Private Sub color_f15_b7()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_INTENSITY
End Sub
'command : color f15 b8
Private Sub color_f15_b8()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN
End Sub
'command : color f15 b9
Private Sub color_f15_b9()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f15 b10
Private Sub color_f15_b10()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : color f15 b11
Private Sub color_f15_b11()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f15 b12
Private Sub color_f15_b12()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f15 b13
Private Sub color_f15_b13()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE
End Sub
'command : color f15 b14
Private Sub color_f15_b14()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE Or BACKGROUND_INTENSITY
End Sub
'command : color f15 b15
Private Sub color_f15_b15()
SetConsoleTextAttribute hConsoleOut, FOREGROUND_RED Or FOREGROUND_GREEN Or FOREGROUND_BLUE Or BACKGROUND_RED Or BACKGROUND_GREEN Or BACKGROUND_BLUE
End Sub
'command : time /h:m:s
Private Sub cmd_time_f1()
ConsolePrint " " & Format(Now, "h:m:s") & vbCrLf
End Sub
'command : time /h:m:s am/pm
Private Sub cmd_time_f2()
ConsolePrint " " & Format(Now, "h:m:s AM/PM") & vbCrLf
End Sub
'command : time /h:m
Private Sub cmd_time_f3()
ConsolePrint " " & Format(Now, "h:m") & vbCrLf
End Sub
'command : time /h:m am/pm
Private Sub cmd_time_f4()
ConsolePrint " " & Format(Now, "h:m AM/PM") & vbCrLf
End Sub
'command : date /dd,mmmm,yyyy
Private Sub cmd_date_f1()
ConsolePrint " " & Format(Now, "dd,mmmm,yyyy") & vbCrLf
End Sub
'command : date /dddd,mmmm dd,yyyy
Private Sub cmd_date_f2()
ConsolePrint " " & Format(Now, "dddd") & ", " & Format(Now, "mmmm") & " " & Format(Now, "dd") & ", " & Format(Now, "yyyy") & vbCrLf
End Sub
'command : date /mm/dd/yyyy
Private Sub cmd_date_f3()
ConsolePrint " " & Format(Now, "mm") & "/" & Format(Now, "dd") & "/" & Format(Now, "yyyy") & vbCrLf
End Sub
'command : date /mm.dd.yy
Private Sub cmd_date_f4()
ConsolePrint " " & Format(Now, "mm.dd.yy") & vbCrLf
End Sub
'command : changedir /c
Private Sub cmd_changedir_c()
'Set the new directory.
New_Directory = "C:"
'Set in what directory we are.
Is_C_Drive = True
Is_D_Drive = False
Is_Y_Drive = False
Is_L_Drive = False
'Create the directory.
Create_Directory = New_Directory
End Sub
'command : changedir /d
Private Sub cmd_changedir_d()
'Set the new directory.
New_Directory = "D:"
'Set in what directory we are.
Is_C_Drive = False
Is_D_Drive = True
Is_Y_Drive = False
Is_L_Drive = False
'Create the directory.
Create_Directory = New_Directory
End Sub
'command : changedir /y
Private Sub cmd_changedir_y()
'Set the new directory.
New_Directory = "<YMOS:\>"
Is_C_Drive = False
Is_D_Drive = False
Is_Y_Drive = True
Is_L_Drive = False
'Create the directory.
Create_Directory = New_Directory
End Sub
'command : changedir /lok$
Private Sub cmd_changedir_lok()
Dim SDL_Listen As String
Dim v As String
ConsolePrint " Enter the name of the SDL file : "
SDL_Listen = ConsoleRead()
ConsolePrint "" & vbCrLf
If Len(SDL_Listen) = 0 Then
ConsolePrint " -> You need to enter a name for the SDL." & vbCrLf & vbCrLf
SDL_Directory = "<YMOS:\>"
Else
If Dir$(App.Path & "\SDL DATA" & SDL_Listen & ".sdl") <> "" Then
Open App.Path & "\SDL DATA" & SDL_Listen & ".sdl" For Input As #1
Do Until EOF(1)
Input #1, v
Loop
SDL_Directory = v
Close #1
Else
ConsolePrint " -> The SDL file is inexistant." & vbCrLf & vbCrLf
SDL_Directory = "<YMOS:\>"
End If
End If
'Set the new directory.
New_Directory = SDL_Directory
Is_C_Drive = False
Is_D_Drive = False
Is_Y_Drive = False
Is_L_Drive = True
'Create the directory.
Create_Directory = New_Directory
End Sub
'command : createdir [name]
Private Sub cmd_createdir_name()
On Error GoTo 1
If Right(New_Directory, 1) = "" Then
MkDir New_Directory & Right(UserInput, Len(UserInput) - 11)
Else
MkDir New_Directory & "" & Right(UserInput, Len(UserInput) - 11)
End If
'Refresh directory.
Create_Directory = ""
'Show that we created the folder.
ConsolePrint " Your folder : " & Chr$(34) & Right(UserInput, Len(UserInput) - 11) & Chr$(34) & " has been created in " & Chr$(34) & New_Directory & Chr$(34) & "." & vbCrLf
Exit Sub
1:
'If the folder is not created.
ConsolePrint " -> To use this command you need to change your current directory to " & Chr$(34) & "C:" & Chr$(34) & " or to " & Chr$(34) & "D:" & Chr$(34) & "." & vbCrLf
End Sub
'command : gotodir [folder.name]
Private Sub cmd_gotodir_name()
If Right(New_Directory, 1) = "" Then
If DirExists(New_Directory & Right(UserInput, Len(UserInput) - 9)) = True Then
'Put the directory path in a temporary variable.
Temporary_Path = New_Directory & Right(UserInput, Len(UserInput) - 9)
'Extract the folder path and put it in the temporary variable.
Folder_Path = Temporary_Path
'Set new directory.
New_Directory = Temporary_Path
'Create new directory.
Create_Directory = New_Directory
Else
ConsolePrint " -> Invalid directory.You must enter a real directory to go to." & vbCrLf
End If
Else
If DirExists(New_Directory & "" & Right(UserInput, Len(UserInput) - 9)) = True Then
'Put the directory path in a temporary variable.
Temporary_Path = New_Directory & "" & Right(UserInput, Len(UserInput) - 9)
'Extract the folder path and put it in the temporary variable.
Folder_Path = Temporary_Path
'Set new directory.
New_Directory = Temporary_Path
'Create new directory.
Create_Directory = New_Directory
Else
ConsolePrint " -> Invalid directory.You must enter a real directory to go to." & vbCrLf
End If
End If
'Refresh folder path.
Folder_Path = ""
End Sub
'command : prvdir
Private Sub cmd_prvdir_name()
BufferLen = 1
For i = 1 To Len(New_Directory)
TemporaryBuffer = Right(New_Directory, BufferLen)
TemporaryBuffer = Left(TemporaryBuffer, 1)
If TemporaryBuffer = "" Then GoTo 1
BufferLen = BufferLen + 1
Next i
Exit Sub
1: New_Directory = Left(New_Directory, Len(New_Directory) - BufferLen)
If Len(New_Directory) = 2 Then New_Directory = New_Directory & ""
Folder_Path = New_Directory
Create_Directory = New_Directory
End Sub
'command : math /x+y
Private Sub cmd_math_t1()
ConsolePrint " X + Y - Operation." & vbCrLf
ConsolePrint " ____________________" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " X = "
Number1 = Val(ConsoleRead())
ConsolePrint "" & vbCrLf
ConsolePrint " Y = "
Number2 = Val(ConsoleRead())
ConsolePrint "" & vbCrLf
If Len(Number1) = 0 Or Len(Number2) = 0 Then
ConsolePrint " Result : 0" & vbCrLf
ElseIf Len(Number1) <> 0 And Is_Number(Number1) = True And Len(Number2) <> 0 And Is_Number(Number2) = True Or Left$(CStr(Number1), 1) = "-" Or Left$(CStr(Number2), 1) = "-" Then
ConsolePrint " Result : " & Number1 * 1 + Number2 & vbCrLf
Else
ConsolePrint " Result : 0" & vbCrLf
End If
End Sub
'command : math /x-y
Private Sub cmd_math_t2()
ConsolePrint " X - Y - Operation." & vbCrLf
ConsolePrint " ____________________" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " X = "
Number1 = Val(ConsoleRead())
ConsolePrint "" & vbCrLf
ConsolePrint " Y = "
Number2 = Val(ConsoleRead())
ConsolePrint "" & vbCrLf
If Len(Number1) = 0 Or Len(Number2) = 0 Then
ConsolePrint " Result : 0" & vbCrLf
ElseIf Len(Number1) <> 0 And Is_Number(Number1) = True And Len(Number2) <> 0 And Is_Number(Number2) = True Or Left$(CStr(Number1), 1) = "-" Or Left$(CStr(Number2), 1) = "-" Then
ConsolePrint " Result : " & Number1 * 1 - Number2 & vbCrLf
Else
ConsolePrint " Result : 0" & vbCrLf
End If
End Sub
'command : math /x:y
Private Sub cmd_math_t3()
ConsolePrint " X : Y - Operation." & vbCrLf
ConsolePrint " ____________________" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " X = "
Number1 = Val(ConsoleRead())
ConsolePrint "" & vbCrLf
ConsolePrint " Y = "
Number2 = Val(ConsoleRead())
ConsolePrint "" & vbCrLf
If Len(Number1) = 0 Or Len(Number2) = 0 Then
ConsolePrint " Result : 0" & vbCrLf
ElseIf Number1 = 0 And Number2 = 0 Then
ConsolePrint " Result : 0" & vbCrLf
ElseIf Len(Number1) <> 0 And Is_Number(Number1) = True And Len(Number2) <> 0 And Is_Number(Number2) = True Or Left$(CStr(Number1), 1) = "-" Or Left$(CStr(Number2), 1) = "-" Then
ConsolePrint " Result : " & Number1 * 1 / Number2 & vbCrLf
Else
ConsolePrint " Result : 0" & vbCrLf
End If
End Sub
'command : math /x*y
Private Sub cmd_math_t4()
ConsolePrint " X * Y - Operation." & vbCrLf
ConsolePrint " ____________________" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " X = "
Number1 = Val(ConsoleRead())
ConsolePrint "" & vbCrLf
ConsolePrint " Y = "
Number2 = Val(ConsoleRead())
ConsolePrint "" & vbCrLf
If Len(Number1) = 0 Or Len(Number2) = 0 Then
ConsolePrint " Result : 0" & vbCrLf
ElseIf Len(Number1) <> 0 And Is_Number(Number1) = True And Len(Number2) <> 0 And Is_Number(Number2) = True Or Left$(CStr(Number1), 1) = "-" Or Left$(CStr(Number2), 1) = "-" Then
ConsolePrint " Result : " & Number1 * 1 * Number2 & vbCrLf
Else
ConsolePrint " Result : 0" & vbCrLf
End If
End Sub
'command : searchdir /sfol /c
Private Sub cmd_searchdir_m1()
Dim FP As FILE_PARAMS 'holds search parameters
Dim tstart As Single 'timer var for this routine only
Dim tend As Single 'timer var for this routine only
Dim UserFolder As String 'variable to hold the user custom folder.
ConsolePrint " Observation ! " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " -> : C:\[Folder 1]\[Folder 2]\[Folder 3]...\[Folder n]" & vbCrLf
ConsolePrint " -> : [Folder 1]\[Folder 2]\[Folder 3]...\[Folder n]" & vbCrLf
ConsolePrint " -> : [Folder x]" & vbCrLf
ConsolePrint " -> : If you don't write a folder(s)/path the search will display the " & Chr$(34) & "C:" & Chr$(34) & " folder(s)." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the folder(s)/path to search in : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
UserFolder = ConsoleRead()
If Left$(UserFolder, 3) = "C:" Then
UserFolder = UserFolder
Else
UserFolder = "C:" & UserFolder
End If
If Len(UserFolder) = 0 Then
ConsolePrint " -> You must enter your own folder(s)/path to be able to search for it's subfolder's." & vbCrLf
ElseIf UserFolder <> "" And DirExists(UserFolder) = True Then
'set up search params
With FP
.sFileRoot = UserFolder 'start path
.sFileNameExt = "*.*" 'file type of interest
.bRecurse = False '0 = not recursive search
End With
ConsolePrint "" & vbCrLf
ConsolePrint " Search in " & Chr$(34) & UserFolder & Chr$(34) & "." & vbCrLf & vbCrLf
'get start time, folders, and finish time
tstart = GetTickCount()
Call SearchForFolders(FP)
tend = GetTickCount()
ConsolePrint "" & vbCrLf
ConsolePrint " Folder(s) Found : " & Format$(FP.Count, "###,###,###,##0") & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Elapsed : " & FormatNumber((tend - tstart) / 1000, 2) & " seconds." & vbCrLf
ElseIf UserFolder <> "" And DirExists(UserFolder) = False Then
ConsolePrint "" & vbCrLf
ConsolePrint " -> Your folder/path : " & UserFolder & " is invalid." & vbCrLf
End If
End Sub
'command : searchdir /sfol /d
Private Sub cmd_searchdir_m2()
Dim FP As FILE_PARAMS 'holds search parameters
Dim tstart As Single 'timer var for this routine only
Dim tend As Single 'timer var for this routine only
Dim UserFolder As String 'variable to hold the user custom folder.
ConsolePrint " Observation ! " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " -> : D:\[Folder 1]\[Folder 2]\[Folder 3]...\[Folder n]" & vbCrLf
ConsolePrint " -> : [Folder 1]\[Folder 2]\[Folder 3]...\[Folder n]" & vbCrLf
ConsolePrint " -> : [Folder x]" & vbCrLf
ConsolePrint " -> : If you don't write a folder(s)/path the search will display the " & Chr$(34) & "D:" & Chr$(34) & " folder(s)." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the folder(s)/path to search in : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
UserFolder = ConsoleRead()
If Left$(UserFolder, 3) = "D:" Then
UserFolder = UserFolder
Else
UserFolder = "D:" & UserFolder
End If
If Len(UserFolder) = 0 Then
ConsolePrint " -> You must enter your own folder/path to be able to search for it's subfolder's." & vbCrLf
ElseIf UserFolder <> "" And DirExists(UserFolder) = True Then
'set up search params
With FP
.sFileRoot = UserFolder 'start path
.sFileNameExt = "*.*" 'file type of interest
.bRecurse = False '0 = not recursive search
End With
ConsolePrint "" & vbCrLf
ConsolePrint " Search in " & Chr$(34) & UserFolder & Chr$(34) & "." & vbCrLf & vbCrLf
'get start time, folders, and finish time
tstart = GetTickCount()
Call SearchForFolders(FP)
tend = GetTickCount()
ConsolePrint "" & vbCrLf
ConsolePrint " Folder(s) Found : " & Format$(FP.Count, "###,###,###,##0") & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Elapsed : " & FormatNumber((tend - tstart) / 1000, 2) & " seconds." & vbCrLf
ElseIf UserFolder <> "" And DirExists(UserFolder) = False Then
ConsolePrint "" & vbCrLf
ConsolePrint " -> Your folder/path : " & UserFolder & " is invalid." & vbCrLf
End If
End Sub
'command : searchdir /sfil /c
Private Sub cmd_searchdir_m3()
Dim tstart As Single 'timer var for this routine only
Dim tend As Single 'timer var for this routine only
Dim UserFile As String 'variable to hold the user custom file.
ConsolePrint " Observation ! " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " -> : C:\[Folder 1]\[Folder 2]\[Folder 3]...\[Folder n]" & vbCrLf
ConsolePrint " -> : [Folder 1]\[Folder 2]\[Folder 3]...\[Folder n]" & vbCrLf
ConsolePrint " -> : [Folder x]" & vbCrLf
ConsolePrint " -> : If you don't write a folder(s)/path the search will display the " & Chr$(34) & "C:" & Chr$(34) & " file(s)." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the folder(s)/path to search in : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
UserFile = ConsoleRead()
If Left$(UserFile, 3) = "C:" Then
UserFile = UserFile
Else
UserFile = "C:" & UserFile
End If
If Len(UserFile) = 0 Then
ConsolePrint " -> You must enter your own folder/path to be able to search for it's file(s)." & vbCrLf
ElseIf UserFile <> "" And DirExists(UserFile) = True Then
With xt
.sFileRoot = UserFile 'start path
.sFileNameExt = "*.*" 'file type(s) of interest
.bRecurse = False 'True = recursive search
.nCount = 0 'results
.nSearched = 0 'results
End With
ConsolePrint "" & vbCrLf
ConsolePrint " Search in " & Chr$(34) & UserFile & Chr$(34) & "." & vbCrLf & vbCrLf
tstart = GetTickCount()
Call SearchForFiles(xt.sFileRoot)
tend = GetTickCount()
ConsolePrint "" & vbCrLf
ConsolePrint " File(s) Searched : " & Format$(xt.nCount, "###,###,###,##0") & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Matched by pattern " & Chr$(34) & "*.*" & Chr$(34) & " : " & Format$(xt.nCount, "###,###,###,##0") & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Elapsed : " & FormatNumber((tend - tstart) / 1000, 2) & " seconds." & vbCrLf
ElseIf UserFile <> "" And DirExists(UserFile) = False Then
ConsolePrint "" & vbCrLf
ConsolePrint " -> Your folder/path : " & UserFile & " is invalid." & vbCrLf
End If
End Sub
'command : searchdir /sfil /d
Private Sub cmd_searchdir_m4()
Dim tstart As Single 'timer var for this routine only
Dim tend As Single 'timer var for this routine only
Dim UserFile As String 'variable to hold the user custom file.
ConsolePrint " Observation ! " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " -> : D:\[Folder 1]\[Folder 2]\[Folder 3]...\[Folder n]" & vbCrLf
ConsolePrint " -> : [Folder 1]\[Folder 2]\[Folder 3]...\[Folder n]" & vbCrLf
ConsolePrint " -> : [Folder x]" & vbCrLf
ConsolePrint " -> : If you don't write a folder(s)/path the search will display the " & Chr$(34) & "D:" & Chr$(34) & " file(s)." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the folder(s)/path to search in : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
UserFile = ConsoleRead()
If Left$(UserFile, 3) = "D:" Then
UserFile = UserFile
Else
UserFile = "D:" & UserFile
End If
If Len(UserFile) = 0 Then
ConsolePrint " -> You must enter your own folder/path to be able to search for it's file(s)." & vbCrLf
ElseIf UserFile <> "" And DirExists(UserFile) = True Then
With xt
.sFileRoot = UserFile 'start path
.sFileNameExt = "*.*" 'file type(s) of interest
.bRecurse = False 'True = recursive search
.nCount = 0 'results
.nSearched = 0 'results
End With
ConsolePrint "" & vbCrLf
ConsolePrint " Search in " & Chr$(34) & UserFile & Chr$(34) & "." & vbCrLf & vbCrLf
tstart = GetTickCount()
Call SearchForFiles(xt.sFileRoot)
tend = GetTickCount()
ConsolePrint "" & vbCrLf
ConsolePrint " File(s) Searched : " & Format$(xt.nCount, "###,###,###,##0") & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Matched by pattern " & Chr$(34) & "*.*" & Chr$(34) & " : " & Format$(xt.nCount, "###,###,###,##0") & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Elapsed : " & FormatNumber((tend - tstart) / 1000, 2) & " seconds." & vbCrLf
ElseIf UserFile <> "" And DirExists(UserFile) = False Then
ConsolePrint "" & vbCrLf
ConsolePrint " -> Your folder/path : " & UserFile & " is invalid." & vbCrLf
End If
End Sub
'Additional sub for search engine.
Private Sub SearchForFolders(FP As FILE_PARAMS)
Dim WFD As WIN32_FIND_DATA
Dim hFile As Long
Dim sRoot As String
Dim spath As String
Dim sTmp As String
sRoot = QualifyPath(FP.sFileRoot)
spath = sRoot & FP.sFileNameExt
'obtain handle to the first match
hFile = FindFirstFile(spath, WFD)
'if valid ...
If hFile <> INVALID_HANDLE_VALUE Then
Do
'Only folders are wanted, so discard files
'or parent/root DOS folders.
If (WFD.dwFileAttributes And FILE_ATTRIBUTE_DIRECTORY) And _
Asc(WFD.cFileName) <> vbDot Then
'must be a folder, so remove trailing nulls
sTmp = TrimNull(WFD.cFileName)
'This is where you add code to store
'or display the returned file listing.
'
'if you want the folder name only, save 'sTmp'.
'if you want the full path, save 'sRoot & sTmp'
FP.Count = FP.Count + 1
ConsolePrint " " & sTmp & vbCrLf
'if a recursive search was selected, call
'this method again with a modified root
If FP.bRecurse Then
FP.sFileRoot = sRoot & sTmp
Call SearchForFolders(FP)
End If
End If
Loop While FindNextFile(hFile, WFD)
'close the handle
hFile = FindClose(hFile)
End If
End Sub
'Additional sub for search engine.
Private Sub SearchForFiles(sRoot As String)
Dim WFD As WIN32_FIND_DATA
Dim hFile As Long
hFile = FindFirstFile(sRoot & ALL_FILES, WFD)
If hFile <> INVALID_HANDLE_VALUE Then
Do
'if a folder, and recurse specified, call
'method again
If (WFD.dwFileAttributes And vbDirectory) Then
If Asc(WFD.cFileName) <> vbDot Then
If xt.bRecurse Then
SearchForFiles sRoot & TrimNull(WFD.cFileName) & ""
End If
End If
Else
'must be a file..
If MatchSpec(WFD.cFileName, xt.sFileNameExt) Then
xt.nCount = xt.nCount + 1
ConsolePrint " " & TrimNull(WFD.cFileName) & vbCrLf
End If 'If MatchSpec
End If 'If WFD.dwFileAttributes
xt.nSearched = xt.nSearched + 1
Loop While FindNextFile(hFile, WFD)
End If 'If hFile
Call FindClose(hFile)
End Sub
'Additional sub for search engine for sdl files.
Private Sub SearchForFilesSDL(sRoot As String)
Dim WFD As WIN32_FIND_DATA
Dim hFile As Long
Dim m As New FileSystemObject
hFile = FindFirstFile(sRoot & ALL_FILES, WFD)
If hFile <> INVALID_HANDLE_VALUE Then
ConsolePrint " SDL File : Date Created :" & vbCrLf
ConsolePrint "" & vbCrLf
Do
'if a folder, and recurse specified, call
'method again
If (WFD.dwFileAttributes And vbDirectory) Then
If Asc(WFD.cFileName) <> vbDot Then
If xt.bRecurse Then
SearchForFiles sRoot & TrimNull(WFD.cFileName) & ""
End If
End If
Else
'must be a file..
If MatchSpec(WFD.cFileName, xt.sFileNameExt) Then
xt.nCount = xt.nCount + 1
ConsolePrint " " & TrimNull(WFD.cFileName) & " " & Left$(CStr(m.GetFile(sRoot & TrimNull(WFD.cFileName)).DateCreated), 10) & vbCrLf
End If 'If MatchSpec
End If 'If WFD.dwFileAttributes
xt.nSearched = xt.nSearched + 1
Loop While FindNextFile(hFile, WFD)
End If 'If hFile
Call FindClose(hFile)
End Sub
'Additional sub for search engine for yml files.
Private Sub SearchForFilesYML(sRoot As String)
Dim WFD As WIN32_FIND_DATA
Dim hFile As Long
Dim m As New FileSystemObject
hFile = FindFirstFile(sRoot & ALL_FILES, WFD)
If hFile <> INVALID_HANDLE_VALUE Then
ConsolePrint " YML File : Date Created :" & vbCrLf
ConsolePrint "" & vbCrLf
Do
'if a folder, and recurse specified, call
'method again
If (WFD.dwFileAttributes And vbDirectory) Then
If Asc(WFD.cFileName) <> vbDot Then
If xt.bRecurse Then
SearchForFiles sRoot & TrimNull(WFD.cFileName) & ""
End If
End If
Else
'must be a file..
If MatchSpec(WFD.cFileName, xt.sFileNameExt) Then
xt.nCount = xt.nCount + 1
ConsolePrint " " & TrimNull(WFD.cFileName) & " " & Left$(CStr(m.GetFile(sRoot & TrimNull(WFD.cFileName)).DateCreated), 10) & vbCrLf
End If 'If MatchSpec
End If 'If WFD.dwFileAttributes
xt.nSearched = xt.nSearched + 1
Loop While FindNextFile(hFile, WFD)
End If 'If hFile
Call FindClose(hFile)
End Sub
'command : encryptstr
Private Sub cmd_encryptstr_t1()
Dim UserPlainText As String
ConsolePrint " Enter the plaintext :" & vbCrLf
ConsolePrint " " & vbCrLf
ConsolePrint " "
UserPlainText = ConsoleRead()
If Len(UserPlainText) = 0 Then
ConsolePrint "" & vbCrLf
ConsolePrint " " & UserPlainText & vbCrLf
Else
ConsolePrint "" & vbCrLf
ConsolePrint " Ciphertext : " & vbCrLf & vbCrLf
ConsolePrint " " & ROT13_EncryptionDecryptionCipher(UserPlainText) & vbCrLf
End If
End Sub
'command : byos /pt
Private Sub cmd_byos_t1()
Dim v As Variant
v = Processorb()
ConsolePrint "" & vbCrLf
ConsolePrint " Processor Type : " & v & vbCrLf
End Sub
'command : byos /np
Private Sub cmd_byos_t2()
Dim v As Variant
v = Processorn()
ConsolePrint "" & vbCrLf
ConsolePrint " Number of processor(s) : " & v & vbCrLf
End Sub
'command : byos /fsd
Private Sub cmd_byos_t3()
Dim result As Single
ConsolePrint "" & vbCrLf
Call FreeDisk
End Sub
'command : byos /cpuu
Private Sub cmd_byos_t4()
ConsolePrint "" & vbCrLf
Call getCPUUsage
End Sub
'command : byos /cpus
Private Sub cmd_byos_t5()
Dim m As Long
ConsolePrint "" & vbCrLf
m = GetCPUSpeed
ConsolePrint " CPU Speed : " & m & " MHZ." & vbCrLf
End Sub
'command : byos /mem
Private Sub cmd_byos_t6()
Dim m As Long
ConsolePrint "" & vbCrLf
ConsolePrint " [Physical Memory]" & vbCrLf & vbCrLf
ConsolePrint " _________________" & vbCrLf & vbCrLf
Call TotalPhysicalMemory
Call AvailablePhysicalMemory
ConsolePrint " [Virtual Memory]" & vbCrLf & vbCrLf
ConsolePrint " _________________" & vbCrLf & vbCrLf
Call TotalVirtualMemory
Call AvailableVirtualMemory
ConsolePrint " [Page File]" & vbCrLf & vbCrLf
ConsolePrint " _________________" & vbCrLf & vbCrLf
Call TotalPageFile
Call AvailablePageFile
End Sub
'command : write@
Private Sub cmd_write()
Dim UserText As String
On Error Resume Next
'Put identation.
ConsolePrint "" & vbCrLf
ConsolePrint " "
'Read the user input.
UserText = ConsoleRead()
'Put in memory the information.
Open App.Path & "\MEMORY DATA\WriteMemory.txt" For Append As #1
If Right$(UserText, 3) = " -&" Or Right$(UserText, 3) = " -p" Or Right$(UserText, 3) = " -e" Then
Write #1, Mid$(UserText, 1, (Len(UserText) - 3))
Else
Write #1, Mid$(UserText, 1, Len(UserText))
End If
Close #1
'Read multiline.
'Special character(s) of the write@ command.
'___________________________________________
'
' [CHARACTER]| [MEANING] |
' -----------|------------------|
' []-& | Line Feed |
' []-p | Pharagraph |
' []-e | End Write |
'
'___________________________________________
' [] = space.
1:
If Right$(UserText, 3) = " -&" Then
Do Until Right$(UserText, 3) <> " -&"
ConsolePrint " "
UserText = ConsoleRead()
'Put in memory the information.
Open App.Path & "\MEMORY DATA\WriteMemory.txt" For Append As #2
If Right$(UserText, 3) = " -&" Or Right$(UserText, 3) = " -p" Or Right$(UserText, 3) = " -e" Then
Write #2, Mid$(UserText, 1, (Len(UserText) - 3))
Else
Write #2, Mid$(UserText, 1, Len(UserText))
End If
Close #2
Loop
GoTo 1
ElseIf Right$(UserText, 3) = " -p" Then
Do Until Right$(UserText, 3) <> " -p"
ConsolePrint " "
UserText = ConsoleRead()
'Put in memory the information.
Open App.Path & "\MEMORY DATA\WriteMemory.txt" For Append As #3
If Right$(UserText, 3) = " -&" Or Right$(UserText, 3) = " -p" Or Right$(UserText, 3) = " -e" Then
Write #3, " " & Mid$(UserText, 1, (Len(UserText) - 3))
Else
Write #3, Mid$(UserText, 1, Len(UserText))
End If
Close #3
Loop
GoTo 1
ElseIf Right$(UserText, 3) = " -e" Then
Do Until Right$(UserText, 3) <> " -e"
Exit Do
Loop
End If
End Sub
'command : read@
Private Sub cmd_read()
Dim PrintText As String
If Dir$(App.Path & "\MEMORY DATA\WriteMemory.txt") <> "" Then
Open App.Path & "\MEMORY DATA\WriteMemory.txt" For Input As #4
Do Until EOF(4)
Input #4, PrintText
ConsolePrint " " & PrintText & vbCrLf
Loop
Close #4
Else
ConsolePrint " -> You don't have something to read." & vbCrLf
ConsolePrint " To read you need to write something to an ASCII file." & vbCrLf
ConsolePrint " To write something to an ASCII file you must use the " & Chr$(34) & " write@ " & Chr$(34) & " command." & vbCrLf
End If
End Sub
'command : delete@
Private Sub cmd_delete()
If Dir$(App.Path & "\MEMORY DATA\WriteMemory.txt") <> "" Then
Kill App.Path & "\MEMORY DATA\WriteMemory.txt"
ConsolePrint " The ASCII file has been deleted." & vbCrLf
Else
ConsolePrint " The ASCII file is inexistent." & vbCrLf
End If
End Sub
'command : script#
Private Sub cmd_script()
Dim ActualScript As String
Dim fso As New FileSystemObject
Dim f As File
Dim x As TextStream
Dim Temp As Variant
On Error Resume Next
'Put identation.
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the name of the script : "
'Read the user input.
ScriptName = ConsoleRead()
If Len(ScriptName) = 0 Then
ConsolePrint "" & vbCrLf
ConsolePrint " -> To create a script you must have a name for it." & vbCrLf
Exit Sub
Else
fso.CreateTextFile App.Path & "\YML SCRIPTS" & ScriptName & ".yml", False
End If
ConsolePrint "" & vbCrLf & vbCrLf
ConsolePrint " #####\__... [YML-SCRIPT] ...__/#####" & vbCrLf & vbCrLf
ConsolePrint " "
'Read the input.
ActualScript = ConsoleRead()
If Right$(ActualScript, 3) = " :e" Then
Set f = fso.GetFile(App.Path & "\YML SCRIPTS" & ScriptName & ".yml")
Set x = f.OpenAsTextStream(ForAppending)
x.WriteLine (Mid$(YMLInterpretor(ActualScript), 1, (Len(YMLInterpretor(ActualScript)) - 3)))
x.Close
Set x = Nothing
Set f = Nothing
Set fso = Nothing
Else
Set f = fso.GetFile(App.Path & "\YML SCRIPTS" & ScriptName & ".yml")
Set x = f.OpenAsTextStream(ForAppending)
x.WriteLine (Mid$(YMLInterpretor(ActualScript), 1, Len(YMLInterpretor(ActualScript))))
x.Close
Set x = Nothing
Set f = Nothing
Set fso = Nothing
End If
If Right$(ActualScript, 3) = " :e" Then
Do Until Right$(ActualScript, 3) <> " :e"
ConsolePrint "" & vbCrLf
ConsolePrint " "
'Read the user input.
ActualScript = ConsoleRead()
If Right$(ActualScript, 3) = " :e" Then
Set f = fso.GetFile(App.Path & "\YML SCRIPTS" & ScriptName & ".yml")
Set x = f.OpenAsTextStream(ForAppending)
x.WriteLine (Mid$(YMLInterpretor(ActualScript), 1, (Len(YMLInterpretor(ActualScript)) - 3)))
x.Close
Set x = Nothing
Set f = Nothing
Set fso = Nothing
Else
Set f = fso.GetFile(App.Path & "\YML SCRIPTS" & ScriptName & ".yml")
Set x = f.OpenAsTextStream(ForAppending)
x.WriteLine (Mid$(YMLInterpretor(ActualScript), 1, Len(YMLInterpretor(ActualScript))))
x.Close
Set x = Nothing
Set f = Nothing
Set fso = Nothing
End If
Loop
End If
'Write the transparent script that auto erase the script file after the program runs.
Set f = fso.GetFile(App.Path & "\YML SCRIPTS" & ScriptName & ".yml")
Set x = f.OpenAsTextStream(ForAppending)
x.WriteLine ("Set fso = CreateObject (" & Chr$(34) & "Scripting.FileSystemObject" & Chr$(34) & ")")
x.WriteLine ("fso.DeleteFile (" & Chr$(34) & "C:" & ScriptName & ".yml" & Chr$(34) & ")")
x.Close
Set x = Nothing
Set f = Nothing
Set fso = Nothing
End Sub
'command : runscript#
Private Sub cmd_runscript()
Dim UserScript As String
Dim fso As New FileSystemObject
On Error GoTo 1
'Retrive the user script name.
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the name of your script to run it : "
'Read the input
UserScript = ConsoleRead()
If Len(UserScript) = 0 Then
ConsolePrint "" & vbCrLf
ConsolePrint " -> You need to enter a name for the script to run it !" & vbCrLf
Exit Sub
Else
'Make a copy of the script in C:\ to run it.
fso.CopyFile App.Path & "\YML SCRIPTS" & UserScript & ".yml", "C:", True
'Run the actual script.
Shell "C:\Windows\System32\WScript.exe //E:vbscript C:" & UserScript & ".yml", vbNormalFocus
End If
Exit Sub
1:
ConsolePrint "" & vbCrLf
ConsolePrint " -> The name of the script is invalid.You don't have a script with the name " & UserScript & " ." & vbCrLf
End Sub
'command : showymls
Private Sub cmd_showymls()
Dim tstart As Single 'timer var for this routine only
Dim tend As Single 'timer var for this routine only
Dim UserFile As String 'variable to hold the user custom file.
Dim gso As New FileSystemObject
ConsolePrint "----------<_Your available YML script's database_>" & vbCrLf & vbCrLf
With xt
.sFileRoot = App.Path & "\YML SCRIPTS" 'start path
.sFileNameExt = "*.yml" 'file type(s) of interest
.bRecurse = False 'True = recursive search
.nCount = 0 'results
.nSearched = 0 'results
End With
tstart = GetTickCount()
Call SearchForFilesYML(xt.sFileRoot)
tend = GetTickCount()
End Sub
'command : runexe ??
Private Sub cmd_runexe()
Dim UserPath As String
ConsolePrint " Enter the path of the executable to run it : " & vbCrLf
ConsolePrint " ------------------------------------------- " & vbCrLf
ConsolePrint " EX : C:\Program Files\Winamp\winamp.exe " & vbCrLf & vbCrLf
ConsolePrint " "
'Enter the input.
UserPath = ConsoleRead()
If Len(UserPath) = 0 Then
ConsolePrint " -> You need to enter the path of the executable to be able to run it." & vbCrLf
Exit Sub
ElseIf FileExists(UserPath) = True Then
Shell UserPath, vbNormalFocus
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> I can't run the executable : " & UserPath & " because the path is invalid." & vbCrLf
End If
End Sub
'command : deleteymls
Private Sub cmd_deleteymls()
Dim userYML As String
ConsolePrint " Enter the name of the YML file : "
userYML = ConsoleRead()
ConsolePrint "" & vbCrLf
If Dir$(App.Path & "\YML SCRIPTS" & userYML & ".yml") <> "" Then
Kill App.Path & "\YML SCRIPTS" & userYML & ".yml"
ConsolePrint " -> The YML file : " & userYML & " has been deleted." & vbCrLf
ElseIf userYML = "" Then
ConsolePrint " -> You need to enter a name of a YML script to delete it !" & vbCrLf
Else
ConsolePrint " -> The " & userYML & " file is inexistent." & vbCrLf
End If
End Sub
'command lok
Private Sub cmd_lok()
Dim l As String
ConsolePrint " Enter the name of the SDL you are creating : "
l = ConsoleRead()
ConsolePrint "" & vbCrLf
If l <> "" Then
SDL_Directory = New_Directory
Open App.Path & "\SDL DATA" & l & ".sdl" For Append As #2
Write #2, SDL_Directory
Close #2
Else
ConsolePrint " -> You need to enter a name to create the SDL." & vbCrLf
SDL_Directory = "<YMOS:\>"
End If
SDL_Directory = "<YMOS:\>"
End Sub
'command : showsdls
Private Sub cmd_showsdls()
Dim tstart As Single 'timer var for this routine only
Dim tend As Single 'timer var for this routine only
Dim UserFile As String 'variable to hold the user custom file.
Dim gso As New FileSystemObject
ConsolePrint "----------<_Your available SDL's database_>" & vbCrLf & vbCrLf
With xt
.sFileRoot = App.Path & "\SDL DATA" 'start path
.sFileNameExt = "*.sdl" 'file type(s) of interest
.bRecurse = False 'True = recursive search
.nCount = 0 'results
.nSearched = 0 'results
End With
tstart = GetTickCount()
Call SearchForFilesSDL(xt.sFileRoot)
tend = GetTickCount()
End Sub
'command : deletesdls
Private Sub cmd_deletesdls()
Dim userSDL As String
ConsolePrint " Enter the name of the SDL file : "
userSDL = ConsoleRead()
ConsolePrint "" & vbCrLf
If Dir$(App.Path & "\SDL DATA" & userSDL & ".sdl") <> "" Then
Kill App.Path & "\SDL DATA" & userSDL & ".sdl"
ConsolePrint " -> The SDL file : " & userSDL & " has been deleted." & vbCrLf
ElseIf Len(userSDL) = 0 Then
ConsolePrint " -> You need to enter a name of a SDL to delete it !" & vbCrLf
Else
ConsolePrint " -> The " & userSDL & " file is inexistent." & vbCrLf
End If
End Sub
'command : text2ascii
Private Sub cmd_text2ascii()
Dim i As Integer
ConsolePrint " ASCII CHARACTER MAP" & vbCrLf
ConsolePrint "" & vbCrLf
For i = 32 To 255 Step 1
If i > 96 And i < 123 Then
ConsolePrint " " & Chr$(i) & " = " & Asc(Chr$(i)) & vbCrLf
ElseIf i > 64 And i < 91 Then
ConsolePrint " " & Chr$(i) & " = " & Asc(Chr$(i)) & vbCrLf
ElseIf i > 47 And i < 58 Then
ConsolePrint " " & Chr$(i) & " = " & Asc(Chr$(i)) & vbCrLf
ElseIf i = 32 Then
ConsolePrint " " & "Space" & " = " & Asc(Chr$(i)) & vbCrLf
Else
ConsolePrint " " & Chr$(i) & " = " & Asc(Chr$(i)) & vbCrLf
End If
Next i
End Sub
'command : nrseqgen
Private Sub cmd_nrseqgen()
Dim k As Long
For k = 1 To 2000 Step 1
ConsolePrint " " & EightDigitPrime & EightDigitPrime & EightDigitPrime & EightDigitPrime & EightDigitPrime & EightDigitPrime & EightDigitPrime & EightDigitPrime & vbCrLf
Next k
End Sub
'command : phranalyse
Private Sub cmd_phranalyse()
Dim MyString As String
Dim tmp(15) As String
ConsolePrint " Enter the word/phrase you want to analyse : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
MyString = ConsoleRead()
If Len(MyString) = 0 Then
ConsolePrint " -> You must fill in with a word/phrase to be able to analyse something." & vbCrLf
Exit Sub
Else
ConsolePrint "" & vbCrLf
tmp(1) = VowelCount(MyString)
tmp(2) = NounCount(MyString)
tmp(3) = NumberCount(MyString)
tmp(4) = SymbolCount(MyString)
tmp(5) = RealStrLenght(MyString)
tmp(6) = PhrasePattern(MyString)
tmp(7) = VowelProcent(MyString)
tmp(8) = NounProcent(MyString)
tmp(9) = NumberProcent(MyString)
tmp(10) = SymbolProcent(MyString)
tmp(11) = WordsFromPhrase(MyString)
tmp(12) = SpaceCount(MyString)
tmp(13) = PhrasePattern2(MyString)
tmp(14) = StrReverse$(MyString)
tmp(15) = PhraseComplexity(MyString)
ConsolePrint " ~-=+ANALYSE RESULT+=-~ : " & MyString & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " * Vowels Quantity : " & tmp(1) & vbCrLf
ConsolePrint " * Nouns Quantity : " & tmp(2) & vbCrLf
ConsolePrint " * Numbers Quantity : " & tmp(3) & vbCrLf
ConsolePrint " * Symbols Quantity : " & tmp(4) & vbCrLf
ConsolePrint " * Real Lenght : " & tmp(5) & vbCrLf
ConsolePrint " * Simple Pattern : " & tmp(6) & vbCrLf
ConsolePrint " * Vowels Percent (%) : " & tmp(7) & vbCrLf
ConsolePrint " * Nouns Percent (%) : " & tmp(8) & vbCrLf
ConsolePrint " * Numbers Percent (%) : " & tmp(9) & vbCrLf
ConsolePrint " * Symbols Percent (%) : " & tmp(10) & vbCrLf
ConsolePrint " * Total Words : " & tmp(11) & vbCrLf
ConsolePrint " * Blank Space : " & tmp(12) & vbCrLf
ConsolePrint " * Complex Pattern : " & tmp(13) & vbCrLf
ConsolePrint " * Reversed Phrase : " & tmp(14) & vbCrLf
ConsolePrint " * Phrase Complexity : " & tmp(15) & vbCrLf
End If
End Sub
'command : rename
Private Sub cmd_rename()
Dim Current_File_Folder_Name As String
Dim New_File_Folder_Name As String
ConsolePrint " !! Observation : If you want to rename a folder/subfolder you must use this syntax :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " C:\[Folder Name 1]\[Folder Name 2]\[Folder Name 3]...\[Folder Name n]" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " If you want to rename a file you must use this syntax :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " C:\[File Name][.][Extension]" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the path of the folder/subfolder/file you want to rename :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
Current_File_Folder_Name = ConsoleRead()
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the path of the folder/subfolder/file with the new name :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
New_File_Folder_Name = ConsoleRead()
ConsolePrint "" & vbCrLf
If Len(New_File_Folder_Name) = 0 Or Len(Current_File_Folder_Name) = 0 Then
ConsolePrint " -> You need to enter the path of the folder/subfolder/file." & vbCrLf
Exit Sub
ElseIf Dir$(Current_File_Folder_Name) <> "" Or Dir$(New_File_Folder_Name) <> "" Then
Name Current_File_Folder_Name As New_File_Folder_Name
ConsolePrint " -> The folder/subfolder/file has been renamed." & vbCrLf
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : runvbs
Private Sub cmd_runvbs()
Dim G1 As String
ConsolePrint " Enter the path of the VB-script file you want to run :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
G1 = ConsoleRead()
If Len(G1) = 0 Then
ConsolePrint " The path is invalid." & vbCrLf
Exit Sub
ElseIf Dir$(G1) <> "" Then
Shell "C:\Windows\System32\WScript.exe //E:vbscript " & G1, vbNormalFocus
Else
ConsolePrint "" & vbCrLf
ConsolePrint " The VB-script file is inexistant." & vbCrLf
End If
End Sub
'command : delete /fol
Private Sub cmd_delete_c1()
Dim Path1 As String
Dim fso As New FileSystemObject
ConsolePrint " Enter the path of the folder you want to delete :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
Path1 = ConsoleRead()
If Len(Path1) = 0 Then
ConsolePrint " -> You need to enter the path of the folder you want to delete." & vbCrLf
Exit Sub
ElseIf DirExists(Path1) = True Then
fso.DeleteFolder (Path1)
ConsolePrint "" & vbCrLf
ConsolePrint " -> The folder has been deleted." & vbCrLf
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The path is inexistant." & vbCrLf
End If
End Sub
'command : delete /fil
Private Sub cmd_delete_c2()
Dim Path1 As String
Dim fso As New FileSystemObject
ConsolePrint " Enter the path of the file you want to delete :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
Path1 = ConsoleRead()
If Len(Path1) = 0 Then
ConsolePrint " -> You need to enter the path of the file you want to delete." & vbCrLf
Exit Sub
ElseIf FileExists(Path1) = True Then
fso.DeleteFile (Path1)
ConsolePrint "" & vbCrLf
ConsolePrint " -> The file has been deleted." & vbCrLf
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The path is inexistant." & vbCrLf
End If
End Sub
'command : move /fol
Private Sub cmd_move_c1()
Dim Old_Path_Folder As String
Dim New_Path_Folder As String
Dim fso As New FileSystemObject
ConsolePrint " Enter the path of the folder/subfolder :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
Old_Path_Folder = ConsoleRead()
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the path in witch you want to move the folder/subfolder :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
New_Path_Folder = ConsoleRead()
ConsolePrint "" & vbCrLf
If Len(Old_Path_Folder) = 0 Or Len(New_Path_Folder) = 0 Then
ConsolePrint " -> You need to enter the path of the folder/subfolder." & vbCrLf
Exit Sub
ElseIf DirExists(Old_Path_Folder) = True Or DirExists(New_Path_Folder) = True Then
Call CopyFolder(Old_Path_Folder, New_Path_Folder)
fso.DeleteFolder (Old_Path_Folder)
ConsolePrint " -> The folder/subfolder has been moved." & vbCrLf
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : move /fil
Private Sub cmd_move_c2()
Dim Old_Path_File As String
Dim New_Path_File As String
Dim fso As New FileSystemObject
Dim bSuccess As Boolean
ConsolePrint " Enter the path of the file :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
Old_Path_File = ConsoleRead()
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the path in witch you want to move the file :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
New_Path_File = ConsoleRead()
ConsolePrint "" & vbCrLf
If Len(Old_Path_File) = 0 Or Len(New_Path_File) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(Old_Path_File) = True Or FileExists(New_Path_File) = True Then
bSuccess = APIFileCopy(Old_Path_File, New_Path_File)
If bSuccess = True Then
ConsolePrint " -> The file has been moved." & vbCrLf
Kill Old_Path_File
ElseIf bSuccess = False Then
ConsolePrint " -> The file has not been moved." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : copy /fol
Private Sub cmd_copy_c1()
Dim Old_Path_Folder As String
Dim New_Path_Folder As String
Dim fso As New FileSystemObject
ConsolePrint " Enter the path of the folder/subfolder :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
Old_Path_Folder = ConsoleRead()
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the path in witch you want to copy the folder/subfolder :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
New_Path_Folder = ConsoleRead()
ConsolePrint "" & vbCrLf
If Len(Old_Path_Folder) = 0 Or Len(New_Path_Folder) = 0 Then
ConsolePrint " -> You need to enter the path of the folder/subfolder." & vbCrLf
Exit Sub
ElseIf DirExists(Old_Path_Folder) = True Or DirExists(New_Path_Folder) = True Then
Call CopyFolder(Old_Path_Folder, New_Path_Folder)
ConsolePrint " -> The folder/subfolder has been copyed." & vbCrLf
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : copy /fil
Private Sub cmd_copy_c2()
Dim Old_Path_File As String
Dim New_Path_File As String
Dim fso As New FileSystemObject
Dim bSuccess As Boolean
ConsolePrint " Enter the path of the file :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
Old_Path_File = ConsoleRead()
ConsolePrint "" & vbCrLf
ConsolePrint " Enter the path in witch you want to copy the file :" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
New_Path_File = ConsoleRead()
ConsolePrint "" & vbCrLf
If Len(Old_Path_File) = 0 Or Len(New_Path_File) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(Old_Path_File) = True Or FileExists(New_Path_File) = True Then
bSuccess = APIFileCopy(Old_Path_File, New_Path_File)
If bSuccess = True Then
ConsolePrint " -> The file has been copyed." & vbCrLf
ElseIf bSuccess = False Then
ConsolePrint " -> The file has not been copyed." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : setattr /ali
Private Sub cmd_setattr_m1()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to set the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Alias) = False Then
SetAttr File_Location, vbAlias
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Alias is set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : setattr /arc
Private Sub cmd_setattr_m2()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to set the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Archive) = False Then
SetAttr File_Location, vbArchive
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Archive is set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : setattr /dir
Private Sub cmd_setattr_m3()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to set the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Directory) = False Then
SetAttr File_Location, vbDirectory
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Directory is set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : setattr /hid
Private Sub cmd_setattr_m4()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to set the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Hidden) = False Then
SetAttr File_Location, vbHidden
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Hidden is set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : setattr /nor
Private Sub cmd_setattr_m5()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to set the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Normal) = False Then
SetAttr File_Location, vbNormal
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Normal is set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : setattr /reo
Private Sub cmd_setattr_m6()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to set the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = ReadOnly) = False Then
SetAttr File_Location, vbReadOnly
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute ReadOnly is set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : setattr /sys
Private Sub cmd_setattr_m7()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to set the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = System) = False Then
SetAttr File_Location, vbSystem
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute System is set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : setattr /vol
Private Sub cmd_setattr_m8()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to set the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Volume) = False Then
SetAttr File_Location, vbVolume
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Volume is set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : remattr /ali
Private Sub cmd_remattr_m1()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to remove the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Alias) = True Then
SetAttr File_Location, GetAttr(File_Location) And (Not vbAlias)
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Alias is not set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : remattr /arc
Private Sub cmd_remattr_m2()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to remove the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Archive) = True Then
SetAttr File_Location, GetAttr(File_Location) And (Not vbArchive)
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Archive is not set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : remattr /dir
Private Sub cmd_remattr_m3()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to remove the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Directory) = True Then
SetAttr File_Location, GetAttr(File_Location) And (Not vbDirectory)
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Directory is not set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : remattr /hid
Private Sub cmd_remattr_m4()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to remove the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Hidden) = True Then
SetAttr File_Location, GetAttr(File_Location) And (Not vbHidden)
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Hidden is not set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : remattr /nor
Private Sub cmd_remattr_m5()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to remove the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Normal) = True Then
SetAttr File_Location, GetAttr(File_Location) And (Not vbNormal)
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Normal is not set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : remattr /reo
Private Sub cmd_remattr_m6()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to remove the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = ReadOnly) = True Then
SetAttr File_Location, GetAttr(File_Location) And (Not vbReadOnly)
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute ReadOnly is not set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : remattr /sys
Private Sub cmd_remattr_m7()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to remove the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = System) = True Then
SetAttr File_Location, GetAttr(File_Location) And (Not vbSystem)
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute System is not set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : remattr /vol
Private Sub cmd_remattr_m8()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file you want to remove the attribute : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
If (m.GetFile(File_Location).Attributes = Volume) = True Then
SetAttr File_Location, GetAttr(File_Location) And (Not vbVolume)
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The attribute Volume is not set." & vbCrLf
End If
Else
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : filattr
Private Sub cmd_filattr()
Dim File_Location As String
Dim m As New FileSystemObject
ConsolePrint " Enter the path of the file : " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " "
File_Location = ConsoleRead()
If Len(File_Location) = 0 Then
ConsolePrint " -> You need to enter the path of the file." & vbCrLf
Exit Sub
ElseIf FileExists(File_Location) = True Then
ConsolePrint " ___________________________________________________" & vbCrLf
ConsolePrint " / " & vbCrLf
ConsolePrint " |__________________/~File Properties~\________________|" & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Name : " & m.GetFile(File_Location).Name & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
ConsolePrint " Size : " & m.GetFile(File_Location).Size & " bytes" & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
ConsolePrint " Path : " & m.GetFile(File_Location).Path & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
ConsolePrint " File Type : " & m.GetFile(File_Location).Type & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
ConsolePrint " Date Created : " & m.GetFile(File_Location).DateCreated & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
ConsolePrint " Date Last Accessed : " & m.GetFile(File_Location).DateLastAccessed & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
ConsolePrint " Date Last Modified : " & m.GetFile(File_Location).DateLastModified & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
ConsolePrint " File Extension : " & m.GetExtensionName(File_Location) & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
ConsolePrint " Parent Folder : " & m.GetFile(File_Location).ParentFolder & vbCrLf
ConsolePrint " -------------------- " & vbCrLf
Else
ConsolePrint "" & vbCrLf
ConsolePrint " -> The path is invalid." & vbCrLf
End If
End Sub
'command : color
Private Sub cmd_color()
ConsolePrint " COMMAND : color -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "COLOR ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : time
Private Sub cmd_time()
ConsolePrint " COMMAND : time -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "TIME ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : date
Private Sub cmd_date()
ConsolePrint " COMMAND : date -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "DATE ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : changedir
Private Sub cmd_changedir()
ConsolePrint " COMMAND : changedir -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "CHANGEDIR ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : createdir
Private Sub cmd_createdir()
ConsolePrint " COMMAND : createdir -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "CREATEDIR ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : gotodir
Private Sub cmd_gotodir()
ConsolePrint " COMMAND : gotodir -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "GOTODIR ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : math
Private Sub cmd_math()
ConsolePrint " COMMAND : math -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "MATH ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : searchdir
Private Sub cmd_searchdir()
ConsolePrint " COMMAND : searchdir -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "SEARCHDIR ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : byos
Private Sub cmd_byos()
ConsolePrint " COMMAND : byos -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "BYOS ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : delete
Private Sub cmd_deletep()
ConsolePrint " COMMAND : delete -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "DELETE ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : move
Private Sub cmd_move()
ConsolePrint " COMMAND : move -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "MOVE ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : copy
Private Sub cmd_copy()
ConsolePrint " COMMAND : copy -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "COPY ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : setattr
Private Sub cmd_setattr()
ConsolePrint " COMMAND : setattr -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "SETATTR ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : remattr
Private Sub cmd_remattr()
ConsolePrint " COMMAND : remattr -> Is a parameter command." & vbCrLf
ConsolePrint " Type " & Chr$(34) & "REMATTR ??" & Chr$(34) & " for more information." & vbCrLf
End Sub
'command : help ??
Private Sub cmd_help_more()
ConsolePrint " -> The meaning of this command is obvious !" & vbCrLf
End Sub
'command : exit ??
Private Sub cmd_exit_more()
ConsolePrint " -> The meaning of this command is obvious !" & vbCrLf
End Sub
'command : cls ??
Private Sub cmd_cls_more()
ConsolePrint " COMMAND : cls = Clear the screen." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : cls " & vbCrLf
End Sub
'command : color ??
Private Sub cmd_color_more()
ConsolePrint " COMMAND : color = Change the forecolor and backcolor of the screen. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : color [Foreground Color][Background Color] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Available Color's " & vbCrLf
ConsolePrint " ----------------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Foreground Color] [Background Color] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " f1 = Red b1 = Red " & vbCrLf
ConsolePrint " f2 = DarkRed b2 = DarkRed " & vbCrLf
ConsolePrint " f3 = Blue b3 = Blue " & vbCrLf
ConsolePrint " f4 = DarkBlue b4 = DarkBlue " & vbCrLf
ConsolePrint " f5 = Green b5 = Green " & vbCrLf
ConsolePrint " f6 = DarkGreen b6 = DarkGreen " & vbCrLf
ConsolePrint " f7 = Yellow b7 = Yellow " & vbCrLf
ConsolePrint " f8 = DarkYellow b8 = DarkYellow " & vbCrLf
ConsolePrint " f9 = Cyan b9 = Cyan " & vbCrLf
ConsolePrint " f10 = DarkCyan b10 = DarkCyan " & vbCrLf
ConsolePrint " f11 = Mangeta b11 = Mangeta " & vbCrLf
ConsolePrint " f12 = DarkMangeta b12 = DarkMangeta " & vbCrLf
ConsolePrint " f13 = Black b13 = Black " & vbCrLf
ConsolePrint " f14 = White b14 = White " & vbCrLf
ConsolePrint " f15 = Grey b15 = Grey " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Example : color f1 b4 => Will result a red text color on a darkblue background. " & vbCrLf
End Sub
'command : time ??
Private Sub cmd_time_more()
ConsolePrint " COMMAND : time = Displays the system time. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : time /[Time Format(s)] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Time Format(s)] " & vbCrLf
ConsolePrint " --------------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /h:m:s = Hour:Minute:Second " & vbCrLf
ConsolePrint " /h:m:s am/pm = Hour:Minute:Second AM/PM " & vbCrLf
ConsolePrint " /h:m = Hour:Minute " & vbCrLf
ConsolePrint " /h:m am/pm = Hour:Minute AM/PM " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Example : time /h:m:s => Will show you time in a form like : 21:30:25" & vbCrLf
End Sub
'command : date ??
Private Sub cmd_date_more()
ConsolePrint " COMMAND : date = Displays the system date. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : date /[Date Format(s)] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Date Format(s)] " & vbCrLf
ConsolePrint " --------------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /dd,mmmm,yyyy = Day,Month,Year " & vbCrLf
ConsolePrint " /dddd,mmmm dd,yyyy = Day,Month,Day Date,Year" & vbCrLf
ConsolePrint " /mm/dd/yyyy = Month/Day/Year " & vbCrLf
ConsolePrint " /mm.dd.yy = Month.Day.Year " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Example : date /dd,mmmm,yyyy => Will show you date in a form like : 23,September,2008" & vbCrLf
End Sub
'command : changedir ??
Private Sub cmd_changedir_more()
ConsolePrint " COMMAND : changedir = Changes the current drive. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : changedir /[Drive(s)] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Drive(s)] " & vbCrLf
ConsolePrint " --------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /c = Change drive to " & Chr$(34) & "C:" & Chr$(34) & " ." & vbCrLf
ConsolePrint " /d = Change drive to " & Chr$(34) & "D:" & Chr$(34) & " ." & vbCrLf
ConsolePrint " /y = Change drive to " & Chr$(34) & "<YMOS:\>" & Chr$(34) & " ." & vbCrLf
ConsolePrint " /lok$ = Change drive to a Standard Directory Location (SDL)." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Example : changedir /c => Will change the current drive to " & Chr$(34) & "C:" & Chr$(34) & " ." & vbCrLf
ConsolePrint " changedir /lok$ => will change the current directory to a variable form like : C:\Folder 1\Folder 2...\Folder n" & vbCrLf
End Sub
'command : createdir ??
Private Sub cmd_createdir_more()
ConsolePrint " COMMAND : createdir = Create a folder. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : createdir [Folder Name] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Folder Name] can be any name given to the folder. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Example : C:\ createdir Sergiu => This will create a folder named " & Chr$(34) & "Sergiu" & Chr$(34) & " in " & Chr$(34) & "C:" & Chr$(34) & "." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " OBSERVATION ! - To use the " & Chr$(34) & "createdir command" & Chr$(34) & " you must change your current directory to " & Chr$(34) & "C:" & Chr$(34) & " or to " & Chr$(34) & "D:" & Chr$(34) & "." & vbCrLf
ConsolePrint " The " & Chr$(34) & "<YMOS:\>" & Chr$(34) & " is a virtual drive and dosen't support the " & Chr$(34) & "createdir command" & Chr(34) & "." & vbCrLf
End Sub
'command : gotodir ??
Private Sub cmd_gotodir_more()
ConsolePrint " COMMAND : gotodir = Go to a specific folder. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : gotodir [Folder Name] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Folder Name] can be any given name to the folder." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Example : C:\ createdir Marius => Will create a folder in " & Chr$(34) & "C:" & Chr$(34) & "." & vbCrLf
ConsolePrint " C:\ gotodir Marius => Will go to the created folder in " & Chr$(34) & "C:\Marius" & Chr(34) & "." & vbCrLf
End Sub
'command : prvdir ??
Private Sub cmd_prvdir_more()
ConsolePrint " COMMAND : prvdir = Go to previous folder. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : prvdir " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Example : C:\ createdir Marius => Will create a folder in " & Chr$(34) & "C:" & Chr$(34) & "." & vbCrLf
ConsolePrint " C:\ gotodir Marius => Will go to the created folder in " & Chr$(34) & "C:\Marius" & Chr$(34) & "." & vbCrLf
ConsolePrint " C:\ prvdir => Will go back in " & Chr$(34) & "C:" & Chr$(34) & "." & vbCrLf
End Sub
'command : math ??
Private Sub cmd_math_more()
ConsolePrint " COMMAND : math = Execute different type(s) of mathematical operation. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : math /[Operator] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Operator] " & vbCrLf
ConsolePrint " ------------ " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /x+y = Execute addition between two number's. " & vbCrLf
ConsolePrint " /x-y = Execute difference between two number's. " & vbCrLf
ConsolePrint " /x:y = Execute division between two number's. " & vbCrLf
ConsolePrint " /x*y = Execute multiplication between two number's. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " Example : math /x+y => Will execute an addition operation. " & vbCrLf
End Sub
'command : searchdir ??
Private Sub cmd_searchdir_more()
ConsolePrint " COMMAND : searchdir = Search and displays a list of folder(s)/Subfolder(s)/file(s) in a specific drive." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : searchdir /[Search Type(s)] /[Drive(s)] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Search Type(s)] " & vbCrLf
ConsolePrint " ---------------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /sfol = Search for folder(s)/subfolder(s). " & vbCrLf
ConsolePrint " /sfil = Search for file(s) in folder(s)/subfolder(s). " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Drive(s)] " & vbCrLf
ConsolePrint " ---------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /c = Search " & Chr$(34) & "C:" & Chr$(34) & " drive. " & vbCrLf
ConsolePrint " /d = Search " & Chr$(34) & "D:" & Chr$(34) & " drive. " & vbCrLf
End Sub
'command : encryptstr ??
Private Sub cmd_encryptstr_more()
ConsolePrint " COMMAND : encryptstr = Encrypt a plaintext. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : encryptstr " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " -> If you encrypt the plaintext it will display the ciphertext." & vbCrLf
ConsolePrint " If you encrypt again the ciphertext it will display the plaintext." & vbCrLf
End Sub
'command : byos ??
Private Sub cmd_byos_more()
ConsolePrint " COMMAND : byos = Displays information about the machine component(s)." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : byos /[Information] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Information] " & vbCrLf
ConsolePrint " ------------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /pt = Displays the processor type. " & vbCrLf
ConsolePrint " /np = Displays the number of processor(s). " & vbCrLf
ConsolePrint " /fsd = Displays free space and capacity of the disk(s). " & vbCrLf
ConsolePrint " /cpuu = Displays the CPU usage. " & vbCrLf
ConsolePrint " /cpus = Displays the CPU speed. " & vbCrLf
ConsolePrint " /mem = Displays memory information. " & vbCrLf
End Sub
'command : write@ ??
Private Sub cmd_write_more()
ConsolePrint " COMMAND : write@ = Write text to an ASCII file. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : write@ " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Special Character(s)] [Meaning] " & vbCrLf
ConsolePrint " ---------------------- -------------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " []-& Line Feed " & vbCrLf
ConsolePrint " []-p Pharagraph " & vbCrLf
ConsolePrint " []-e End Write " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [] = Space. " & vbCrLf
End Sub
'command : read@ ??
Private Sub cmd_read_more()
ConsolePrint " COMMAND : read@ = Read text from an ASCII file. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMMAND SYNTAX : read@ " & vbCrLf
End Sub
'command : delete@ ??
Private Sub cmd_delete_more()
ConsolePrint " COMMAND : delete@ = Delete an ASCII file. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMMAND SYNTAX : delete@ " & vbCrLf
End Sub
'command : script# ??
Private Sub cmd_script_more()
ConsolePrint " COMMAND : script# = Create a YML script. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : script# " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " YML Language Reference " & vbCrLf
ConsolePrint " ---------------------- " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " a) CREATING AN INPUT. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [VARIABLE] [ATTRIB] [INPUT][STREAM][TERMINATOR_CHR] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [VARIABLE] : G1,G2,V1,ghj,V2 etc. " & vbCrLf
ConsolePrint " [ATTRIB] : equal " & vbCrLf
ConsolePrint " [INPUT] : >> " & vbCrLf
ConsolePrint " [STREAM] : {" & Chr$(34) & "Your Text" & Chr$(34) & ";" & Chr$(34) & "Name of the input" & Chr$(34) & "}" & vbCrLf
ConsolePrint " [TERMINATOR_CHR] : :e (Line Feed) " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " b) CREATING AN OUTPUT. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [OUTPUT][STREAM][TERMINATOR_CHR] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [OUTPUT] : << " & vbCrLf
ConsolePrint " [STREAM] : " & Chr$(34) & "Your Text" & Chr$(34) & vbCrLf
ConsolePrint " [TERMINATOR_CHR] : :e (Line Feed) " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " c) DECLARE VARIABLE. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [DECLARE][VARIABLE] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [DECLARE] : Mem " & vbCrLf
ConsolePrint " [VARIABLE] : G1,G2,G3,xtc,Mother_x etc. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " -> For a complete reference over the YML language you can read" & vbCrLf
ConsolePrint " the YML Complete Language Reference. " & vbCrLf
End Sub
'command : runscript# ??
Private Sub cmd_runscript_more()
ConsolePrint " COMMAND : runscript# = Run an YML script. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : runscript# " & vbCrLf
End Sub
'command : showymls ??
Private Sub cmd_showymls_more()
ConsolePrint " COMMAND : showymls = Show a list of all available YML script's." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : showymls " & vbCrLf
End Sub
'command : runexe ??
Private Sub cmd_runexe_more()
ConsolePrint " COMMAND : runexe = Run an executable program. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : runexe " & vbCrLf
End Sub
'command : deleteymls ??
Private Sub cmd_deleteymls_more()
ConsolePrint " COMMAND : deleteymls = Delete a specific YML script. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : deleteymls " & vbCrLf
End Sub
'command : lok$ ??
Private Sub cmd_lok_more()
ConsolePrint " COMMAND : lok$ = Create a Standard Directory Location (SDL)." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : lok$" & vbCrLf
End Sub
'command : showsdls ??
Private Sub cmd_showsdls_more()
ConsolePrint " COMMAND : showsdls = Show a list of all available Standard Directory Location." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : showsdls " & vbCrLf
End Sub
'command : deletesdls ??
Private Sub cmd_deletesdls_more()
ConsolePrint " COMMAND : deletesdls = Delete a specific Standard Directory Location." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : deletesdls " & vbCrLf
End Sub
'command : text2ascii ??
Private Sub cmd_text2ascii_more()
ConsolePrint " COMMAND : text2ascii = Show a list of ASCII character's." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : text2ascii " & vbCrLf
End Sub
'command : nrseqgen ??
Private Sub cmd_nrseqgen_more()
ConsolePrint " COMMAND : nrseqgen = Pseudo-Random Sequence Number Generator." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : nrseqgen " & vbCrLf
End Sub
'command : phranalyse ??
Private Sub cmd_phranalyse_more()
ConsolePrint " COMMAND : phranalyse = Make a word/phrase analyse." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : phranalyse " & vbCrLf
End Sub
'command : rename ??
Private Sub cmd_rename_more()
ConsolePrint " COMMAND : rename = Rename a folder/subfolder/file." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : rename " & vbCrLf
End Sub
'command : runvbs ??
Private Sub cmd_runvbs_more()
ConsolePrint " COMMAND : runvbs = Run a VB-Script file." & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : runvbs " & vbCrLf
End Sub
'command : delete ??
Private Sub cmd_deletep_more()
ConsolePrint " COMMAND : delete = Delete a folder/subfolder/file. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : delete /[Type] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Type] " & vbCrLf
ConsolePrint " ------ " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /fol = Delete a folder/subfolder. " & vbCrLf
ConsolePrint " /fil = Delete a specific file in a folder/subfolder." & vbCrLf
End Sub
'command : move ??
Private Sub cmd_move_more()
ConsolePrint " COMMAND : move = Move a folder/subfolder/file. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : move /[Type] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Type] " & vbCrLf
ConsolePrint " ------ " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /fol = Move a folder/subfolder from one location to another." & vbCrLf
ConsolePrint " /fil = Move a specific file from one location to another. " & vbCrLf
End Sub
'command : copy ??
Private Sub cmd_copy_more()
ConsolePrint " COMMAND : copy = copy a folder/subfolder/file. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : copy /[Type] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [Type] " & vbCrLf
ConsolePrint " ------ " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /fol = Copy a folder/subfolder from one location to another." & vbCrLf
ConsolePrint " /fil = Copy a specific file from one location to another. " & vbCrLf
End Sub
'command : setattr ??
Private Sub cmd_setattr_more()
ConsolePrint " COMMAND : setattr = Set file attributes. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : setattr /[AttrType] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [AttrType] " & vbCrLf
ConsolePrint " ------ " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /ali = Set attribute Alias to a file. " & vbCrLf
ConsolePrint " /arc = Set attribute Archive to a file. " & vbCrLf
ConsolePrint " /dir = Set attribute Directory to a file. " & vbCrLf
ConsolePrint " /hid = Set attribute Hidden to a file. " & vbCrLf
ConsolePrint " /nor = Set attribute Normal to a file. " & vbCrLf
ConsolePrint " /reo = Set attribute ReadOnly to a file. " & vbCrLf
ConsolePrint " /sys = Set attribute System to a file. " & vbCrLf
ConsolePrint " /vol = Set attribute Volume to a file. " & vbCrLf
End Sub
'command : remattr ??
Private Sub cmd_remattr_more()
ConsolePrint " COMMAND : remattr = Remove file attributes. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : remattr /[AttrType] " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " [AttrType] " & vbCrLf
ConsolePrint " ------ " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " /ali = Remove attribute Alias from a file. " & vbCrLf
ConsolePrint " /arc = Remove attribute Archive form a file. " & vbCrLf
ConsolePrint " /dir = Remove attribute Directory from a file. " & vbCrLf
ConsolePrint " /hid = Remove attribute Hidden from a file. " & vbCrLf
ConsolePrint " /nor = Remove attribute Normal from a file. " & vbCrLf
ConsolePrint " /reo = Remove attribute ReadOnly from a file. " & vbCrLf
ConsolePrint " /sys = Remove attribute System from a file. " & vbCrLf
ConsolePrint " /vol = Remove attribute Volume from a file. " & vbCrLf
End Sub
'command : filattr ??
Private Sub cmd_filattr_more()
ConsolePrint " COMMAND : filattr = Shows file properties. " & vbCrLf
ConsolePrint "" & vbCrLf
ConsolePrint " COMMAND SYNTAX : filattr " & vbCrLf
End Sub