Monday 13 May 2019

ClearClipboard.exe clears any data on the Windows' clipboard

This uses the inbuilt compilers in Windows 10 - there are three VB.NET compilers and three C# compilers - just copy each text file into the same folder and double click the batch file to make the program.
REM ClearClipboard.bat
REM This file compiles ClearClipboard.vb to ClearClipboard.exe using the system VB.NET compiler
REM ClearClipboard clears any data on the Windows' clipboard
"C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc.exe" /target:winexe /out:"%~dp0\ClearClipboard.exe" "%~dp0\ClearClipboard.vb" 
pause



'ClearClipboard.vb
Imports System
Imports System.Windows.Forms.Clipboard
Public Module MyApplication  


 Sub Main()
  System.Windows.Forms.Clipboard.Clear()
 End Sub
End Module

Sunday 12 May 2019

ListAttr.exe lists all 19 of the attributes of a file, folder, volume, or device.

This uses the inbuilt compilers in Windows 10 - there are three VB.NET compilers and three C# compilers - just copy each text file into the same folder and double click the batch file to make the program.
@echo off
ECHO Three files follow
ECHO ListAttr.bat
ECHO This file compiles ListAttr.vb to ListAttr.exe using the system VB.NET compiler.
ECHO ListAttr.exe lists all 19 of the attributes of a file, folder, volume, or device.
Echo To Use
Echo         ListAttr ^
Echo -----------------------------------------------------------------------------------------
C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc "%~dp0\ListAttr.vb" /out:"%~dp0\ListAttr.exe" /target:exe
Pause



Echo ListAttrTest.Bat
"%~dp0\ListAttr" C:
"%~dp0\ListAttr" C:\
"%~dp0\ListAttr" C:\Windows\System32\Catroot
"%~dp0\ListAttr" nul
"%~dp0\ListAttr" c:\bootnxt
For /d %%A in ("C:\Windows\*") Do @"%~dp0\ListAttr" %%~A
Pause



'ListAttr.vb
imports System.Runtime.InteropServices 
Public Module MyApplication  

Public Declare Unicode Function GetFileAttributesW Lib "Kernel32" (ByVal Path As String) As Integer
Public Const FILE_ATTRIBUTE_ARCHIVE = 32 
Public Const FILE_ATTRIBUTE_COMPRESSED = 2048 
Public Const FILE_ATTRIBUTE_DEVICE = 64 
Public Const FILE_ATTRIBUTE_DIRECTORY = 16 
Public Const FILE_ATTRIBUTE_ENCRYPTED = 16384 
Public Const FILE_ATTRIBUTE_HIDDEN = 2 
Public Const FILE_ATTRIBUTE_INTEGRITY_STREAM = 32768 
Public Const FILE_ATTRIBUTE_NORMAL = 128 
Public Const FILE_ATTRIBUTE_NOT_CONTENT_INDEXED = 8192 
Public Const FILE_ATTRIBUTE_NO_SCRUB_DATA = 131072 
Public Const FILE_ATTRIBUTE_OFFLINE = 4096 
Public Const FILE_ATTRIBUTE_READONLY = 1 
Public Const FILE_ATTRIBUTE_RECALL_ON_DATA_ACCESS = 4194304 
Public Const FILE_ATTRIBUTE_RECALL_ON_OPEN = 262144 
Public Const FILE_ATTRIBUTE_REPARSE_POINT = 1024 
Public Const FILE_ATTRIBUTE_SPARSE_FILE = 512 
Public Const FILE_ATTRIBUTE_SYSTEM = 4 
Public Const FILE_ATTRIBUTE_TEMPORARY = 256 
Public Const FILE_ATTRIBUTE_VIRTUAL = 65536 
  
Public Sub Main ()
 Dim Ret as Integer
 Dim OutPut As String
 Output = Command() & " - " & vbtab & vbtab
 Ret = GetFileAttributesW(Command())
 If Ret = -1 Then 
  Console.writeline("Error " & err.lastdllerror)
 Else
  If (Ret And FILE_ATTRIBUTE_ARCHIVE) = FILE_ATTRIBUTE_ARCHIVE Then Output = OutPut & "Archive "
  If (Ret And FILE_ATTRIBUTE_COMPRESSED) = FILE_ATTRIBUTE_COMPRESSED Then Output = OutPut & "Compressed "
  If (Ret And FILE_ATTRIBUTE_DEVICE) = FILE_ATTRIBUTE_DEVICE Then Output = OutPut & "Device "
  If (Ret And FILE_ATTRIBUTE_DIRECTORY) = FILE_ATTRIBUTE_DIRECTORY Then Output = OutPut & "Directory "
  If (Ret And FILE_ATTRIBUTE_ENCRYPTED) = FILE_ATTRIBUTE_ENCRYPTED Then Output = OutPut & "Encrypted "
  If (Ret And FILE_ATTRIBUTE_HIDDEN) = FILE_ATTRIBUTE_HIDDEN Then Output = OutPut & "Hidden "
  If (Ret And FILE_ATTRIBUTE_INTEGRITY_STREAM) = FILE_ATTRIBUTE_INTEGRITY_STREAM Then Output = OutPut & "Integrity_Stream "
  If (Ret And FILE_ATTRIBUTE_NORMAL) = FILE_ATTRIBUTE_NORMAL Then Output = OutPut & "Normal "
  If (Ret And FILE_ATTRIBUTE_NOT_CONTENT_INDEXED) = FILE_ATTRIBUTE_NOT_CONTENT_INDEXED Then Output = OutPut & "Not_Content_Indexed "
  If (Ret And FILE_ATTRIBUTE_NO_SCRUB_DATA) = FILE_ATTRIBUTE_NO_SCRUB_DATA Then Output = OutPut & "No_Scrub_Data "
  If (Ret And FILE_ATTRIBUTE_READONLY) = FILE_ATTRIBUTE_READONLY Then Output = OutPut & "ReadOnly "
  If (Ret And FILE_ATTRIBUTE_RECALL_ON_DATA_ACCESS) = FILE_ATTRIBUTE_RECALL_ON_DATA_ACCESS Then Output = OutPut & "Recall_On_Data_Access "
  If (Ret And FILE_ATTRIBUTE_RECALL_ON_OPEN) = FILE_ATTRIBUTE_RECALL_ON_OPEN Then Output = OutPut & "Recall_On_Open "
  If (Ret And FILE_ATTRIBUTE_REPARSE_POINT) = FILE_ATTRIBUTE_REPARSE_POINT Then Output = OutPut & "Reparse "
  If (Ret And FILE_ATTRIBUTE_SPARSE_FILE) = FILE_ATTRIBUTE_SPARSE_FILE Then Output = OutPut & "Sparse "
  If (Ret And FILE_ATTRIBUTE_SYSTEM) = FILE_ATTRIBUTE_SYSTEM Then Output = OutPut & "System "
  If (Ret And FILE_ATTRIBUTE_TEMPORARY) = FILE_ATTRIBUTE_TEMPORARY Then Output = OutPut & "Temporary "
  If (Ret And FILE_ATTRIBUTE_VIRTUAL) = FILE_ATTRIBUTE_VIRTUAL Then Output = OutPut & "Virtual "
 End If
 Console.writeline(OutPut)
End Sub
End Module 

Saturday 11 May 2019

SetWindowText.exe sets the titlebar text for a window

This uses the inbuilt compilers in Windows 10 - there are three VB.NET compilers and three C# compilers - just copy each text file into the same folder and double click the batch file to make the program.
Window Manipulation Posts

@Echo Off
Echo Two files follow
Echo SetWindowText.bat
Echo This file compiles SetWindowText.vb to SetWindowText.exe using the system VB.NET compiler.
Echo SetWindowText.exe sets the titlebar text for a window
Echo     SetWindowText.exe "OldWindowTitle" "NewWindowTitle"
Echo EG Open notepad and type in a command prompt
Echo     SetWindowText.exe "Untitled - Notepad" "My Window Title"
Echo ----------------------------------------------------------------------
"C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc.exe" /target:winexe /out:"%~dp0\SetWindowText.exe" "%~dp0\SetWindowText.vb" 
pause



Imports System
Imports System.Runtime.InteropServices
Imports Microsoft.Win32

Public Module MyApplication  


Public Declare UNICODE Function FindWindowW Lib "user32" (ByVal lpClassName As String, ByVal lpWindowName As String) As IntPtr

Public Declare UNICODE Function SetWindowTextW Lib "user32" (ByVal hwnd As IntPtr, ByVal lpString As String) As Integer

Sub Main()
On Error Resume Next
Dim CmdLine As String
Dim Ret as Integer
Dim A() as String
Dim hwindows as IntPtr

CmdLine = Command()
If Left(CmdLine, 2) = "/?" Then
    MsgBox("Usage:" & vbCrLf & vbCrLf & "SetText ""OldWindowTitle"" ""NewWindowTitle""")
Else
    A = Split(CmdLine, Chr(34), -1, vbBinaryCompare)
    hwindows = FindWindowW(vbNullString, A(1))
    Ret = SetWindowTextW(hwindows, A(3))
End If
End Sub
End Module


Friday 10 May 2019

TopMost.exe set a window on top or not

This uses the inbuilt compilers in Windows 10 - there are three VB.NET compilers and three C# compilers - just copy each text file into the same folder and double click the batch file to make the program.
Window Manipulation Posts

@Echo Off
Echo TopMost.bat
Echo This file compiles TopMost.vb to TopMost.exe
Echo TopMost.exe set a window on top or not
Echo To use 
Echo     TopMost Top ^
Echo     TopMost Not ^
Echo E.G.
Echo     TopMost Top Untitled - Notepad
Echo -----------------------------------------------------
"C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc.exe" /target:winexe /out:"%~dp0\TopMost.exe" "%~dp0\TopMost.vb" 
pause



'TopMost.vb
Imports System
Imports System.IO
Imports System.Runtime.InteropServices
Imports Microsoft.Win32

Public Module TopMost
 Public Declare UNICODE Function FindWindowW Lib "user32" (ByVal lpClassName As String, ByVal lpWindowName As String) As IntPtr
 Public Declare Function SetWindowPos Lib "user32" (ByVal hwnd As IntPtr, ByVal hWndInsertAfter As Integer, ByVal x As Integer, ByVal y As Integer, ByVal cx As Integer, ByVal cy As Integer, ByVal wFlags As Integer) As Integer
 Public Const HWND_TOPMOST = -1
 Public Const SWP_NOMOVE = &H2
 Public Const SWP_NOSIZE = &H1
 Public Const HWND_NOTOPMOST = -2


 Sub Main()
  On Error Resume Next
  Dim hWindows as IntPtr
  Dim CmdLine as String
  Dim Ret as Integer
  CmdLine = Mid(Command(),5)
  hwindows = FindWindowW(vbNullString, CmdLine)
  If hwindows = 0 then
   Msgbox(Cmdline & " cannot be found.")
  Else
   If LCase(Left(Command(), 3)) = LCase("Top") then
    Ret = SetWindowPos(hwindows, HWND_TOPMOST, 0, 0, 0, 0, SWP_NOMOVE + SWP_NOSIZE)
    If Ret = 0 Then MsgBox("Set Pos Error is " & Err.LastDllError)
   ElseIf LCase(Left(Command(), 3)) = LCase("Not") then
    Ret = SetWindowPos(hwindows, HWND_NOTOPMOST, 0, 0, 0, 0, SWP_NOMOVE + SWP_NOSIZE)
    If Ret = 0 Then MsgBox("Set Pos Error is " & Err.LastDllError)
   Else
    Msgbox("Command line not recognised")
   End If
  End If
 End Sub
End Module

Thursday 9 May 2019

DeDup.exe Removes duplicate lines from StdIn and writes to StdOut

REM DeDup.bat
REM This file compiles DeDup.vb to DeDup.exe
REM DeDup.exe Removes duplicate lines from StdIn and writes to StdOut
REM To use
REM DeDup  < inputfile.txt > outputfile.txt
"C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc.exe" /target:exe /out:"%~dp0\DeDup.exe" "%~dp0\DeDup.vb" /verbose
pause










'DeDup.vb
Imports System
Imports System.IO
Imports System.Runtime.InteropServices
Imports Microsoft.Win32

Public Module DeDup
Sub Main
        Dim Dict as Object
        Dict = CreateObject("Scripting.Dictionary")
        Dim Line As Object
        Line=Console.readline
        Do Until Line = vbnull
                On Error Resume Next
                Dict.Add(Line, "")
                On Error Goto 0
                Line=Console.readline
        Loop


        For Each thing in Dict.Keys()
                Console.writeline(thing)
        Next
End Sub
End Module










Wednesday 8 May 2019

ListConsole.exe - similar to Unix's $SHLVL variable - list the processes in the current console and returns an errorlevel saying how many.

This uses the inbuilt compilers in Windows 10 - there are three VB.NET compilers and three C# compilers - just copy each text file into the same folder and double click the batch file to make the program.

Similar to Unix's $SHLVL variable but adds ProcessIDs and command lines. List the processes in the current console and returns an ErrorLevel saying how many.




REM ListConsole.bat
REM This file compiles ListConsole.vb to ListConsole.exe
REM ListConsole.exe list the processes in the console and returns an errorlevel saying how many.
REM Similar to Unix's $SHLVL variable but adds ProcessIDs.
C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc "%~dp0\ListConsole.vb" /out:"%~dp0\ListConsole.exe" /target:exe








---------------------------------------------------------------------------------






REM ListConsoleTest.bat
REM Shows ListConsole.exe in action.
cmd /c "%~dp0ListConsole.exe"
Echo Number of Processes is %errorlevel%
pause








-------------------------------------------------------------------------------





'ListConsole.vb
imports System.Runtime.InteropServices
Public Module MyApplication 

Public Declare Function GetConsoleProcessList Lib "Kernel32" (ByRef ProcessList as Integer, ByVal Count as Integer) As Integer
                
Public Sub Main ()
                Dim ProcessList(0 To 9) As Integer
                Dim Count As Integer
                Dim Ret As Integer
                Dim x as Integer
                Dim ColItems as Object
                Dim objWMIService As Object
                objWMIService = GetObject("winmgmts:\\.\root\cimv2")
                Count = 10
                'subtract one to account for this program
                Ret = GetConsoleProcessList(ProcessList(0), 10) - 1
                Console.Writeline("Level = " & Ret)

                For x = Ret  to 1 step -1
                    colItems = objWMIService.ExecQuery("Select * From Win32_Process where ProcessID=" & ProcessList(x))
                    For Each objItem in colItems
                        Console.writeline("PID : " & objItem.ProcessID & "  Command line : " &  objItem.CommandLine)
                    Next
                Next
                Environment.ExitCode = Ret         
End Sub
End Module



Tuesday 7 May 2019

ListEnvironment.exe List System, User, Volatile, and the resultant Process environmental variables that programs use.

This uses the inbuilt compilers in Windows 10 - there are three VB.NET compilers and three C# compilers - just copy each text file into the same folder and double click the batch file to make the program.
REM Two files follow
REM ListEnvironment.bat
REM This file compiles ListEnvironment.vb to ListEnvironment.exe using the system VB.NET compiler.
REM List System, User, Volatile, and the resultant Process environmental variables that programs use.
C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc "%~dp0\ListEnvironment.vb" /out:"%~dp0\ListEnvironment.exe" /target:exe
REM To use
REM ListEnvironment
pause










-----------------------------------------------------------------------------------------




'ListEnvironment.vb
Imports System.Runtime.InteropServices
Public Module ListEnvironment
        Public Sub Main ()
                Dim WshShell As Object
                Dim wshsysEnv As ObJect
                Dim S As Object
                WshShell = CreateObject("WScript.Shell")

                wshsysEnv = WshShell.Environment("SYSTEM")
                console.writeline(vbCrLf & "--------")
                console.writeline("System")
                console.writeline("--------")
                For Each S In wshsysEnv
                    console.writeline(S)
                Next

                console.writeline(" ")
                wshsysEnv = WshShell.Environment("Volatile")
                console.writeline("--------")
                console.writeline("Volatile - These are set at logon")
                console.writeline("--------")
                For Each S In wshsysEnv
                    console.writeline(S)
                Next

                console.writeline(" ")
                wshsysEnv = WshShell.Environment("User")
                console.writeline("--------")
                console.writeline("User - These override system variables, and in the case of PATH are added to the system PATH")
                console.writeline("--------")
                For Each S In wshsysEnv
                    console.writeline(S)
                Next

                console.writeline(" ")
                wshsysEnv = WshShell.Environment("Process")
                console.writeline("--------")
                console.writeline("Process - This is the combined environment from the above for the program")
                console.writeline("          Variables starting with an equals sign, such as =C:=C:\Windows are internal CMD variables")
                console.writeline("          CMD simulates a default directory per drive like MSDos. This is how it keeps track")
                console.writeline("--------")
                For Each S In wshsysEnv
                    console.writeline(S)
                Next

                console.writeline(" ")
                console.writeline("--------")
                console.writeline("Dynamic - These are updated each time they are used")
                console.writeline("--------")
                console.writeline("CD")
                console.writeline("DATE")
                console.writeline("TIME")
                console.writeline("RANDOM")
                console.writeline("ERRORLEVEL")
                console.writeline("CMDEXTVERSION")
                console.writeline("CMDCMDLINE")
                console.writeline("HIGHESTNUMANODENUMBER")
        End Sub
End Module


PrintClip.exe prints any text or filenames on the clipboard to a StdOutn. Most programs cannot print filenames on the clipboard.

This uses the inbuilt compilers in Windows 10 - there are three VB.NET compilers and three C# compilers - just copy each text file into the same folder and double click the batch file to make the program.

REM PrintClip.bat
REM This file compiles PrintClip.vb to PrintClip.exe
REM PrintClip.exe prints any text or filenames on the clipboard to a StdOut. Most programs cannot print filenames on the clipboard.
REM To use
REM PrintClip
"C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc.exe" /target:exe /out:"%~dp0\PrintClip.exe" "%~dp0\PrintClip.vb" /verbose
pause








---------------------------------------------------------------------------------









'PrintClip.vb
Imports System
Imports System.IO
Imports System.Runtime.InteropServices
Imports Microsoft.Win32

Public Module PrintClip
        Public Declare Function IsClipboardFormatAvailable Lib "user32" (ByVal wFormat As Integer) As Integer
        Public Declare Function GetClipboardData Lib "user32" (ByVal wFormat As Integer) As IntPtr
        Public Declare Function OpenClipboard Lib "user32" (ByVal hwnd As IntPtr) As Integer
        Public Declare Function CloseClipboard Lib "user32" () As Integer
        Public Declare UNICODE Function DragQueryFileW Lib "shell32.dll" (ByVal HDROP As Integer, ByVal UINT As Integer, ByVal lpStr As String, ByVal ch As Integer) As Integer

        Public Const CF_TEXT = 1
        Public Const CF_BITMAP = 2
        Public Const CF_METAFILEPICT = 3
        Public Const CF_SYLK = 4
        Public Const CF_DIF = 5
        Public Const CF_TIFF = 6
        Public Const CF_OEMTEXT = 7
        Public Const CF_DIB = 8
        Public Const CF_PALETTE = 9
        Public Const CF_PENDATA = 10
        Public Const CF_RIFF = 11
        Public Const CF_WAVE = 12
        Public Const CF_UNICODETEXT = 13
        Public Const CF_ENHMETAFILE = 14
        Public Const CF_HDROP = 15
        Public Const CF_OWNERDISPLAY = &H80
        Public Const CF_DSPTEXT = &H81
        Public Const CF_DSPBITMAP = &H82
        Public Const CF_DSPMETAFILEPICT = &H83
        Public Const CF_DSPENHMETAFILE = &H8E


        Sub Main()
'                On Error Resume Next
                Dim Ret as IntPtr
                If OpenClipboard(0) <> 0 then
                        If IsClipboardFormatAvailable(CF_UNICODETEXT) <> 0 then
                                Ret = GetClipboardData( CF_UNICODETEXT)
                                Console.writeline(Marshal.PtrToStringUni(Ret))
                                Environment.ExitCode = 0
                        ElseIf IsClipboardFormatAvailable(CF_hDrop) <> 0 then
                                Dim TotalCount as Integer
                                Dim FName as String
                                Dim hDrop as IntPtr
                                hDrop = GetClipboardData( CF_hDrop)
                                FName = Space(33000)
                                TotalCount = DragQueryFileW(hDrop,  &hFFFFFFFF, FName, 33000)
                                For x = 0 to TotalCount - 1
                                        FName = Space(33000)
                                        If DragQueryFileW(hDrop,  x, FName, 33000) <> 0 then
                                                Console.writeline(Trim(FName))
                                        End If
                                Next
                                Environment.ExitCode = 0
                        Else
                                Environment.ExitCode = 1
                                Console.writeline("No text or filenames on clipboard")
                        End If
                        CloseClipboard()
                Else
                        Environment.ExitCode = err.lastdllerror
                        Console.Writeline("Clipboard is locked by another application")
                End If

        End Sub
End Module

Monday 6 May 2019

WinList.exe list the open windows and their child windows' Window Title, Window Class, and the EXE file

This uses the inbuilt compilers in Windows 10 - there are three VB.NET compilers and three C# compilers - just copy each text file into the same folder and double click the batch file to make the program.
Window Manipulation Posts

REM WinList.bat
REM This file compiles WinList.vb to WinList.exe
REM WinList.exe list the open windows and their child windows' Window Title, Window Class, and the EXE file that created the window. 
REM To use type WinList in a command prompt
C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc "%~dp0\WinList.vb" /out:"%~dp0\WinList.exe" /target:exe
Pause
---------------------------------------------------------------------------------
'WinList.vb
imports System.Runtime.InteropServices 
Public Module WinList  

Public Declare Function GetTopWindow Lib "user32" (ByVal hwnd As IntPtr) As IntPtr
Public Declare Function GetWindow Lib "user32" (ByVal hwnd As IntPtr, ByVal wCmd As Integer) As IntPtr
Public Declare UNICODE Function GetWindowModuleFileNameW Lib "user32" (ByVal hwnd As IntPtr, ByVal WinModule As String, StringLength As Integer) As Integer
Public Declare UNICODE Function GetWindowTextW Lib "user32" (ByVal hwnd As IntPtr, ByVal lpString As String, ByVal cch As Integer) As Integer
Public Declare Function GetWindowThreadProcessId Lib "user32" (ByVal hwnd As IntPtr, ByRef lpdwProcessId As IntPtr) As IntPtr
Public Declare UNICODE Function GetClassNameW Lib "user32" (ByVal hwnd As IntPtr, ByVal lpClassName As String, ByVal nMaxCount As Integer) As Integer
Public Declare Function IsWindowUnicode Lib "user32" (ByVal hwnd As IntPtr) As Boolean
Public Const GW_CHILD = 5
Public Const GW_HWNDNEXT = 2
  
Public Sub Main ()
 Dim WindowChain as Integer
     WindowChain = 0 
 Dim hwnd As IntPtr
 hwnd = GetTopWindow(0)
 If hwnd <> 0 Then
              AddChildWindows(hwnd, 0)
         End If
End Sub


Private Sub AddChildWindows(ByVal hwndParent As IntPtr, ByVal Level As Integer) 
 Dim objWMIService As Object
 Dim colItems As Object
 Dim TempStr As String 
 Dim WT As String, CN As String, Length As Integer, hwnd As IntPtr, TID As IntPtr, PID As IntPtr, MN As String, Parenthwnd As IntPtr
        Static Order As Integer
        Static FirstTime As Integer
        Parenthwnd = hwndParent
        If Level = 0 Then
                        hwnd = hwndParent
        Else
            hwnd = GetWindow(hwndParent, GW_CHILD)
        End If
        Do While hwnd <> 0
                 WT = Space(512)
                  Length = GetWindowTextW(hwnd, WT, 508)
                  WT = Left$(WT, Length)
                  If WT = "" Then WT = Chr(171) & "No Window Text" & Chr(187)
                  CN = Space(512)
                  Length = GetClassNameW(hwnd, CN, 508)
                  CN = Left$(CN, Length)
                  If CN = "" Then CN = "Error=" & Err.LastDllError
                  MN = ""
                  
                  TID = GetWindowThreadProcessId(hwnd, PID)
                  
 objWMIService = GetObject("winmgmts:\\.\root\cimv2")
 colItems = objWMIService.ExecQuery("Select * From Win32_Process where ProcessID=" & CStr(PID))
 For Each objItem in colItems 
  MN = objItem.name 
 Next                    
                Dim Unicode  as Boolean
 Unicode = IsWindowUnicode(hwnd)

                  Order = Order + 1
                If FirstTime = 0 Then
                    Console.writeline("Window Text                             " & "Class Name                       " & vbTab & "Unicode" & vbtab & "HWnd" & vbTab & "ParentHWnd" & vbTab & "ProcessID" & vbTab & "ThreadID" & vbTab & "Process Name" )
                    FirstTime = 1
                End If
 TempStr = vbCrLf & Space(Level * 3) & WT 
 If 30 - len(TempStr) > -1 then
  TempStr = TempStr & space(40 - len(TempStr))
 End If
 TempStr = TempStr & " " & CN 
 If 55 - len(TempStr) > -1 then
  TempStr = TempStr & space(75 - len(TempStr))
 End If
                Console.write(TempStr  & vbtab & Unicode & vbTab & CStr(hwnd) & vbTab & CStr(Parenthwnd) & vbTab & CStr(PID) & vbTab & CStr(TID) & vbTab & MN )
                 
                  AddChildWindows(hwnd, Level + 1)
                  hwnd = GetWindow(hwnd, GW_HWNDNEXT)
        Loop
      End Sub

End Module 

Tee.exe Reads from StdIn and writes to StdOut and a file.

REM Tee.bat
REM This file compiles Tee.vb to Tee.exe
REM Tee.exe Reads from StdIn and writes to StdOut and a file.
REM To use
REM    Tee Filename
Rem     Filename - name of file
Rem
Rem Example
Rem
Rem     tee "%userprofile%\Desktop\winini.txt" < "%windir%\win.ini"
"C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc.exe" /target:exe /out:"%~dp0\Tee.exe" "%~dp0\Tee.vb"
pause








-------------------------------------------------------------------------------------





'Tee.vb

Imports System

Imports System.IO

Imports System.Runtime.InteropServices

Imports Microsoft.Win32

 

Public Module Tee

Sub Main

        Dim Line as Object

        Dim FSO as Object

        Dim File as Object

        On Error Resume Next

        Fso = CreateObject("Scripting.FileSystemObject")

        File = Fso.CreateTextFile(Replace(Command(), """", ""), True)

        If err.number <> 0 then

                Console.WriteLine("Error: " & err.number & " " & err.description & " from " & err.source)

                err.clear

        Else

                Line=Console.readline

                Do Until Line = vbnull

                        File.Writeline(Line)

                        Console.WriteLine(Line)

                        Line = Console.ReadLine

                Loop

        End If

End Sub       

End Module

Sunday 5 May 2019

Cut.exe Removes specified lines from top or bottom of streams from StdIn and writes to StdOut.


REM Cut.bat
REM This file compiles Cut.vb to Cut.exe
REM Cut.exe Removes specified from top or bottom of lines from StdIn and writes to StdOut
REM To use
REM     cut {t|b} {i|x} NumOfLines
Rem Cuts the number of lines from the top or bottom of file.
Rem     t - top of the file
Rem     b - bottom of the file
Rem     i - include n lines
Rem     x - exclude n lines
Rem
Rem Example - Includes first 5 lines Win.ini
Rem
Rem     cut t i 5 < "%systemroot%\win.ini"
"C:\Windows\Microsoft.NET\Framework\v4.0.30319\vbc.exe" /target:exe /out:"%~dp0\Cut.exe" "%~dp0\Cut.vb"
pause


----------------------------------------------------------------------





'Cut.vb
Imports System
Imports System.IO
Imports System.Runtime.InteropServices
Imports Microsoft.Win32

Public Module Cut
Sub Main
    Dim Arg() As Object
    Dim RS as Object
    Dim LineCount as Object
    Dim Line as Object
    Arg = Split(Command(), " ")
    rs = CreateObject("ADODB.Recordset")
    With rs
        .Fields.Append("LineNumber", 4)
        .Fields.Append("Txt", 201, 5000)
        .Open
        LineCount = 0
        Line=Console.readline
        Do Until Line = vbnull
            LineCount = LineCount + 1
            .AddNew
            .Fields("LineNumber").value = LineCount
            .Fields("Txt").value = Console.readline
            .UpDate
            Line = Console.ReadLine
        Loop

        .Sort = "LineNumber ASC"

        If LCase(Arg(0)) = "t" then
            If LCase(Arg(1)) = "i" then
                .filter = "LineNumber < " & LCase(Arg(2)) + 1
            ElseIf LCase(Arg(1)) = "x" then
                .filter = "LineNumber > " & LCase(Arg(2))
            End If
        ElseIf LCase(Arg(0)) = "b" then
            If LCase(Arg(1)) = "i" then
                .filter = "LineNumber > " & LineCount - LCase(Arg(2))
            ElseIf LCase(Arg(1)) = "x" then
                .filter = "LineNumber < " & LineCount - LCase(Arg(2)) + 1
            End If
        End If

        Do While not .EOF
            Console.writeline(.Fields("Txt").Value)
            .MoveNext
        Loop
    End With

End Sub   
End Module