Hello old brother VBA ace I am a novice


I don't know anything but I like this thing and I have a piece of code here, right
So he says I'm going to select any cell that has data and hit the button to run the macro (VBA)
He goes down to the cell that the mouse has selected in a single column and if he finds it, he'll do it in red
What he was looking for was something outside that was related to what was inside the text document
I now want him to be a mouse and select any cell and then he is
I'm going to go down the whole line and I'm going to do it in red
Here's the code

Thank you for being able to help me believe you thank you


Sub Text ()
SngStart = Timer
Application. ScreenUpdating = False
Application. DisplayAlerts = False
Call Text1
Call Text2
Call Text3
The Call test 4
Application. DisplayAlerts = True
Application. ScreenUpdating = True
MsgBox "Time consuming:" & Round(timer-SngStart, 2) & "second"
End Sub


Private Sub CommandButton1_Click ()
Call the Text
End Sub


Private Sub CommandButton2_Click ()
Call dateAnsy
End Sub


Private Sub CommandButton3_Click ()
Open thisworkbook. Path & "\1.00. TXT "For Input As #1
AA = StrConv(InputB(LOF(1), 1), vbUnicode)
Close # 1
AA = Replace(AA, vbCrLf, "")
SS = Split(AA, "")
Dim t As a String
T = Selection. Address (0, 0)
If InStr(t, ":") <= 0 Then
Current column = Mid(t, 1, 1)
Current row = Mid(t, 2)
Rows1 = Range(current column & "65536").end (xlUp).row 'a total number of rows
For II1 = current row To Rows1
For II2 = 0 To UBound(SS)
If Len(SS(iii 2)), >, 0 Then
Trim(Sheet1.range (current column & II1)) = Trim(SS(II2)) Then
Sheet1.Range(current column & II1).interior.Color = QBColor(12)
End the If
End the If
Next
Next
End the If
End Sub