Menú

Mostrar Mensajes

Esta sección te permite ver todos los mensajes escritos por este usuario. Ten en cuenta que sólo puedes ver los mensajes escritos en zonas a las que tienes acceso en este momento.

Mostrar Mensajes Menú

Temas - XP.

#1
Hola quiero editar una cadena en el registro de windows pero no lo hace

Private Sub Form_Load()
Shell "reg add hkcu\Control Panel\Desktop /v WaitToKillAppTimeout /t reg_sz /d 50000 /f "
End Sub

que esta mal?
#2
Scripting / Borrar en BATCH
1 Mayo 2007, 16:26 PM
Hola, he buscado en otros foros como puedo borrar lo siguiente:

C:\Documents and Settings\Administrador\Menú Inicio\Programas\WinRAR

C:\Documents and Settings\Administrador\Menú Inicio\Programas\Asistencia remota.ink

pero no he encontrado ninguna forma, los codigos que he utilizado no funcionan
#3
Multimedia / Formato .MOV
6 Enero 2007, 20:39 PM
Hola, chicos conocen algun programa que sirva para cambiar del formato .MOV a AVI o MPG???
#4
Bueno, me preguntaba si es posible desde mi programa denegar/anular siempre CreateThread y CreateremoteThread para impedir que inyecten codigo en un proceso.  :(
#5
Bueno queria saber que programa me recomiendan para proteger mi aplicación...
me dijeron que el execryptor es muy bueno pero tengo que pagar 120 euros por la licencia :/
necesito saber si existen otras alternativas pero buenas  ;)
#6
Hola a todos les comento un poco el inconveniente:
He creado un programa con VB6 en Windows XP, el problema es que en Windows 98 el Form no aparece... ejecuto el exe y el proceso del programa aparece pero el Form no :(

que puede ser?
#7
bueno tengo como minimizar a la bandeja del sistema y funciona perfecto pero la duda que tengo es como puedo hacer para que al hacer 1 click  sobre el icono en la bandeja con el boton izquierdo mi programa se maximize  :huh:

#8
Como puedo bloquear inyecciones en un determinado proceso con una DLL??
#10
Hola, necesito que me den una mano, aqui vamos:

Tengo un codigo para inyectar una DLL en el Counter Strike, cuando el proceso hl.exe se inicia inyecta la DLL pero me dice esto:
http://img368.imageshack.us/img368/1880/dibujolh1.jpg
el inyector funciona pero en algunas computadoras, al cerrar y abrir rapidamente el Counter-Strike causa que se desconfigure las opciones de video ("OpenGL, Direct3D or Software").
mi tarjeta de video es 100% compatible con el modo OpenGL

aca les dejo el codigo del inyector:

en un Form:
Private Declare Function ForceLibrary Lib "forcelibrary.dll" (ByVal szDll As String, lpProcessInformation As PROCESS_INFORMATION) As Long
Private Declare Function CreateProcess Lib "kernel32" Alias "CreateProcessA" _
                                      (ByVal lpApplicationName As Long, ByVal lpCommandLine As String, _
                                       ByVal lpProcessAttributes As Long, ByVal lpThreadAttributes As Long, _
                                       ByVal bInheritHandles As Long, ByVal dwCreationFlags As Long, _
                                       ByVal lpEnvironment As Long, ByVal lpCurrentDirectory As Long, _
                                       lpStartupInfo As STARTUPINFO, _
                                       lpProcessInformation As PROCESS_INFORMATION) As Long
Private Declare Function ResumeThread Lib "kernel32.dll" (ByVal hThread As Long) As Long

Private Type STARTUPINFO
    cb As Long
    lpReserved As String
    lpDesktop As String
    lpTitle As String
    dwX As Long
    dwY As Long
    dwXSize As Long
    dwYSize As Long
    dwXCountChars As Long
    dwYCountChars As Long
    dwFillAttribute As Long
    dwFlags As Long
    wShowWindow As Integer
    cbReserved2 As Integer
    lpReserved2 As Long
    hStdInput As Long
    hStdOutput As Long
    hStdError As Long
End Type

Private Type PROCESS_INFORMATION
    hProcess As Long
    hThread As Long
    dwProcessId As Long
    dwThreadID As Long
End Type


Dim handle
Dim pid

Private Declare Sub Sleep Lib "kernel32" (ByVal dwMilliseconds As Long)

Private Sub Form_Load()
Timer1.Enabled = True
Timer1.Interval = 100
End Sub

Private Sub Timer1_Timer()
handle = FindWindow(vbNullString, "Counter-Strike")
handle = GetWindowThreadProcessId(handle, pid)

If pid > 0 Then
If pid = Label1.Caption Then
Else
KillProcess ("hl.exe")
Timer1.Enabled = False
End If
End If

End Sub

Public Sub KillProcess(ByVal processName As String)
On Error Resume Next
Dim oWMI
Dim ret
Dim sService
Dim oWMIServices
Dim oWMIService
Dim oServices
Dim oService
Dim servicename
Set oWMI = GetObject("winmgmts:")
Set oServices = oWMI.InstancesOf("win32_process")
For Each oService In oServices

servicename = LCase(Trim(CStr(oService.Name) & ""))

If InStr(1, servicename, LCase(processName), vbTextCompare) > 0 Then
ret = oService.Terminate
End If

Next

Set oServices = Nothing
Set oWMI = Nothing


ErrHandler:
Err.Clear

    Sleep (Text1.Text * 1000)
    injectar
    Timer2.Enabled = True
    Timer2.Interval = (Text1.Text * 5000)
End Sub

Private Sub injectar()
    Dim ret As Long
    Dim inicio As STARTUPINFO
    Dim proce As PROCESS_INFORMATION
   
    inicio.cb = Len(inicio)
    proce.hProcess = -1
    proce.hThread = -1

    ret& = CreateProcess(0&, "C:\Archivos de programa\Valve\hl.exe -nomaster -game cstrike", 0&, 0&, 0&, CREATE_SUSPENDED, 0&, 0, inicio, proce)
    Label1.Caption = proce.dwProcessId
    ret = ForceLibrary(CurDir & "\hook.dll", proce)
    ret = ForceLibrary("C:\WINDOWS\system32\opengl32.dll", proce)
    ret = ResumeThread(proce.hThread)


End Sub

Private Sub Timer2_Timer()
Timer1.Enabled = True
Timer2.Enabled = False
End Sub


en un módulo
Option Explicit

Public hModule          As Long
Public hProcess         As Long
Public dwSize           As Long
Public dwPid            As Long
Public dwBytesWritten   As Long
Public dwTid            As Long

Public SE               As SECURITY_ATTRIBUTES

Public Const PAGE_READONLY              As Long = &H2
Public Const PAGE_READWRITE             As Long = &H4
Public Const PAGE_EXECUTE               As Long = &H10
Public Const PAGE_EXECUTE_READ          As Long = &H20
Public Const PAGE_EXECUTE_READWRITE     As Long = &H40
Public Const MEM_RELEASE                As Long = &H8000
Public Const MEM_COMMIT                 As Long = &H1000
Public Const MEM_RESERVE                As Long = &H2000
Public Const MEM_RESET                  As Long = &H80000
Public Const STANDARD_RIGHTS_REQUIRED   As Long = &HF0000
Public Const SYNCHRONIZE                As Long = &H100000
Public Const PROCESS_ALL_ACCESS         As Long = (STANDARD_RIGHTS_REQUIRED Or SYNCHRONIZE Or &HFFF)
Public Const INFINITE                   As Long = &HFFFFFF

Public Type SECURITY_ATTRIBUTES
       nLength                 As Long
       lpSecurityDescriptor    As Long
       bInheritHandle          As Long
End Type

Private Declare Function VirtualAllocEx Lib "kernel32" (ByVal hProcess As Long, ByVal lpAddress As Long, ByVal dwSize As Long, ByVal flAllocationType As Long, ByVal flProtect As Long) As Long
Private Declare Function VirtualFreeEx Lib "kernel32" (ByVal hProcess As Long, lpAddress As Any, ByVal dwSize As Long, ByVal dwFreeType As Long) As Long
Public Declare Function CreateRemoteThread Lib "kernel32" (ByVal hProcess As Long, lpThreadAttributes As SECURITY_ATTRIBUTES, ByVal dwStackSize As Long, lpStartAddress As Long, lpParameter As Any, ByVal dwCreationFlags As Long, lpThreadId As Long) As Long
Public Declare Function FindWindow Lib "user32" Alias "FindWindowA" (ByVal lpClassName As String, ByVal lpWindowName As String) As Long
Public Declare Function GetWindowThreadProcessId Lib "user32" (ByVal hWnd As Long, lpdwProcessId As Long) As Long
Public Declare Function OpenProcess Lib "kernel32" (ByVal dwDesiredAccess As Long, ByVal bInheritHandle As Long, ByVal dwProcessId As Long) As Long
Public Declare Function WriteProcessMemory Lib "kernel32" (ByVal hProcess As Long, lpBaseAddress As Any, lpBuffer As Any, ByVal nSize As Long, lpNumberOfBytesWritten As Long) As Long
Public Declare Function GetModuleHandle Lib "kernel32" Alias "GetModuleHandleA" (ByVal lpModuleName As String) As Long
Public Declare Function GetProcAddress Lib "kernel32" (ByVal hModule As Long, ByVal lpProcName As String) As Long
Public Declare Function WaitForSingleObject Lib "kernel32" (ByVal hHandle As Long, ByVal dwMilliseconds As Long) As Long
Public Declare Function CloseHandle Lib "kernel32" (ByVal hObject As Long) As Long

Public Function Inject(szDll As String, szTargetWindowClassName) As Boolean
Dim hWnd        As Long
Dim k32LL       As Long
Dim Thread      As Long

   SE.nLength = Len(SE)
   SE.lpSecurityDescriptor = False
   
   'Encontrar la ventana y abrir el proceso
   'hWnd = FindWindow(szTargetWindowClassName, vbNullString)
   'GetWindowThreadProcessId hWnd, dwPid
   dwPid = szTargetWindowClassName
   hProcess = OpenProcess(PROCESS_ALL_ACCESS, False, dwPid)
   If hProcess = 0 Then GoTo Inject_Error
   k32LL = GetProcAddress(GetModuleHandle("kernel32.dll"), "LoadLibraryA")
   
   'Reservamos memoria
   hModule = VirtualAllocEx(hProcess, 0, LenB(szDll), MEM_COMMIT, PAGE_READWRITE)
   If hModule = 0 Then GoTo Inject_Error
   WriteProcessMemory hProcess, ByVal hModule, ByVal szDll, LenB(szDll), dwBytesWritten
   
   Thread = CreateRemoteThread(hProcess, SE, 0, ByVal k32LL, ByVal hModule, 0, dwTid)
   If Thread = 0 Then GoTo Inject_Error
   
   'Clean up a bit
   WaitForSingleObject Thread, 100
   VirtualFreeEx hProcess, hModule, 0&, MEM_RELEASE
   CloseHandle Thread

Exit Function

Inject_Error:
   Inject = False
   MsgBox "error"
   Exit Function
End Function
#11
Hola, necesito un code  buscar dos archivos: hl.exe y cstrike.exe apartir de un boton, esto yo ya lo tenia pero lo borre y ahora lo necesito urgente  ;D

y tambien

En un MSGBOX necesito escribir.. en el SEGUNDO renglon, puedo hacerlo asi
MsgBox("Hola                                                                        Hola")
pero se que hay un metodo mejor, como en HTM al usar <br>
#12
Hola tengo un problema, me baje el systray.ocx y intento minimizar a la bandeja del sistema y el icono aparece alado del reloj pero la pestaña de mi programa se ve en la barra de inicio en vez de desaparecer... como hago para que no aparezca ahi??

PD: tambien queria preguntar que tengo que hacer para que mi programa se minimize al systray cuando encuentre el nombre de la ventana de un programa o el proceso.

Saludos.
#13
Hola, estuve buscando y buscando y buscando por dias hasta que encontre un codigo que funcione bien.
El tema es que el que consegui Ejecuta la aplicacion y le inyecta la DLL, lo que yo necesito es que inyecte la dll en un proceso, no que CREEE un proceso y le inyecte la dll, no se si se entiende.. El proceso ya esta corriendo no hay que crearlo. aca posteo el inyector, si alguien puede ayudarme mil gracias!

Private Declare Function ForceLibrary Lib "forcelibrary.dll" (ByVal szDll As String, lpProcessInformation As PROCESS_INFORMATION) As Long
Private Declare Function CreateProcess Lib "kernel32" Alias "CreateProcessA" _
(ByVal lpApplicationName As Long, ByVal lpCommandLine As String, _
ByVal lpProcessAttributes As Long, ByVal lpThreadAttributes As Long, _
ByVal bInheritHandles As Long, ByVal dwCreationFlags As Long, _
ByVal lpEnvironment As Long, ByVal lpCurrentDirectory As Long, _
lpStartupInfo As STARTUPINFO, _
lpProcessInformation As PROCESS_INFORMATION) As Long
Private Declare Function ResumeThread Lib "kernel32.dll" (ByVal hThread As Long) As Long

Private Type STARTUPINFO
cb As Long
lpReserved As String
lpDesktop As String
lpTitle As String
dwX As Long
dwY As Long
dwXSize As Long
dwYSize As Long
dwXCountChars As Long
dwYCountChars As Long
dwFillAttribute As Long
dwFlags As Long
wShowWindow As Integer
cbReserved2 As Integer
lpReserved2 As Long
hStdInput As Long
hStdOutput As Long
hStdError As Long
End Type

Private Type PROCESS_INFORMATION
hProcess As Long
hThread As Long
dwProcessID As Long
dwThreadID As Long
End Type


Private Sub Command4_Click()
Dim ret As Long
Dim inicio As STARTUPINFO
Dim proce As PROCESS_INFORMATION

inicio.cb = Len(inicio)
proce.hProcess = -1
proce.hThread = -1

ret& = CreateProcess(0&, "C:\Archivos de programa\Valve\hl.exe -nomaster -game cstrike", 0&, 0&, 0&, CREATE_SUSPENDED, 0&, 0, inicio, proce)
If ret = 0 Then
MsgBox ("Error en CreateProcess")
End If

ret = ForceLibrary(CurDir & "\hook.dll", proce)
If ret = 0 Then
MsgBox ("Error en ForceLibrary")
End If

ret = ResumeThread(proce.hThread)
End Sub
#14
Hola, queria saber como puedo hacer para escribir en la consola del Counter-Strike averigue y se que la ventana se llama "valve001" probe usando los sendkeys pero siempre hay algun error, asi que queria saber si alguien me puede ayudar, consegui para escribir en la consola del Quake 3 lo adapte pero me tira errores, lo dejo aqui abajo. Muchas Gracias!

En un MODULO:

Declare Function CallWindowProc Lib "user32" Alias "CallWindowProcA" _
(ByVal lpPrevWndFunc As Long, _
ByVal hwnd As Long, _
ByVal Msg As Long, _
ByVal wParam As Long, _
ByVal lParam As Long) As Long

Public Declare Function SetWindowLong Lib "user32" Alias "SetWindowLongA" (ByVal hwnd As Long, ByVal nIndex As Long, ByVal dwNewLong As Long) As Long
Declare Function GetWindowLong Lib "user32" Alias "GetWindowLongA" (ByVal hwnd As Long, ByVal nIndex As Long) As Long
Declare Function SendMessage Lib "user32" Alias "SendMessageA" (ByVal hwnd As Long, ByVal wMsg As Long, ByVal wParam As Long, lParam As Any) As Long
Public Declare Function FindWindow Lib "user32" Alias "FindWindowA" (ByVal lpClassName As String, ByVal lpWindowName As String) As Long
Declare Function FindWindowEx Lib "user32" Alias "FindWindowExA" (ByVal hWnd1 As Long, ByVal hWnd2 As Long, ByVal lpsz1 As String, ByVal lpsz2 As String) As Long
Private Declare Function GetLastError Lib "kernel32" () As Long
Private Declare Function FormatMessage Lib "kernel32" Alias "FormatMessageA" (ByVal dwFlags As Long, lpSource As Any, ByVal dwMessageId As Long, ByVal dwLanguageId As Long, ByVal lpBuffer As String, ByVal nSize As Long, Arguments As Long) As Long
Private Const LINE_LEN = 512
Private Const GWL_WNDPROC = (-4)
Private Const WM_COMMAND = &H111
Private Const EN_CHANGE = &H300
Private Const EM_GETLINE = &HC4
Private Const EM_GETLINECOUNT = &HBA
Const FORMAT_MESSAGE_ALLOCATE_BUFFER = &H100
Const FORMAT_MESSAGE_FROM_SYSTEM = &H1000
Public Const GAME_WINDOW = "Counter-Strike"
Dim hWndEditRead As Long, hWndEditWrite As Long
Dim thisline As Long
Dim numlines As Long
Dim szLastLine(LINE_LEN) As String
Dim bOnce As Boolean
Global o_WndProc As Long


Public Sub SubClass(hwnd As Long)
Dim buffer As String
buffer = Space(200)
SetWindowLong hwnd, GWL_WNDPROC, AddressOf WindowProc
o_WndProc = GetWindowLong(hwnd, GWL_WNDPROC)
FormatMessage FORMAT_MESSAGE_FROM_SYSTEM, ByVal 0&, GetLastError, LANG_NEUTRAL, buffer, 200, ByVal 0&
MsgBox buffer
o_WndProc = o_WndProc
End Sub
Function WindowProc(ByVal hw As Long, _
ByVal uMsg As Long, _
ByVal wParam As Long, _
ByVal lParam As Long) As Long

Select Case uMsg
Case WM_COMMAND
If wParam = EN_CHANGE Then
If Not bOnce Then
hWndEditRead = lParam
hWndEditWrite = FindWindowExA(FindWindow(0, GAME_WINDOW), Null, "Edit", 0)
bOnce = True
End If
numlines = SendMessage(hWndEditRead, EM_GETLINECOUNT, 0, 0)
thisline = SendMessage(hWndEditRead, EM_GETLINE, numlines - 2, szLastLine)
Form1.Text1.Text = thisline
End If
WindowProc = CallWindowProc(o_WndProc, hw, uMsg, wParam, lParam)
End Select
End Function



EN UN FORM:

Private Sub Form_Load()
Timer1.Enabled = True
Timer1.Interval = 5000
End Sub

Private Sub Timer1_Timer()
SubClass FindWindow("valve001", vbNullString)
End Sub


Cuando lo pruebo en el CS me pone "Acceso denegado"  :-[
#15
Programación Visual Basic / Proteger proceso
29 Junio 2006, 14:50 PM
Hola a todos, es posible proteger el proceso de mi programa para que no le inyecten codigos?

me dijeron que con la API virtualprotect o algo asi se podia  :-\
#16
s
#17
Programación Visual Basic / Inyectar DLL
25 Mayo 2006, 01:31 AM

-
#18
Holas, como podria hacer un programa que detecte a los programas que quieren interceptar el juego y simplemente bloquearlos???
#19
Hola gente les comento que estoy buscando una manera de evitar que se usen todos los cheats para counter strike como el cdhack, endorphine y otros cheats dentro de mi server y estoy pensando en trabajar sobre el archivo HL.EXE para hacerlo, mi duda es que le puedo hacer????

alguna idea?

PD: Los cheats se usan mediante inyeccion en el archivo "hl.exe" y la mayoria están hechos en C++.

mi programa anterior logro bloquear el uso de varios cheats pero no todos...
#20
Bueno despues de hacer mi anticheat, en otras maquinas sale esto:



se que hay veces que se soluciona registrando la librearia pero es muy molesto, como hago para integrarle a mi programa esa libreria en un instalador??

Saludos.
#21
Programación Visual Basic / Problema Timer
11 Abril 2006, 18:42 PM
A mi me da error cuando pongo lo que quiero hacer en este codigo

Timer1.enabled = True
Timer1.interval = 0
Label88.caption = 0
Private Sub Timer1_timer()
Label88.caption = Label88.caption + 1
If label88.caption = 1 then
ACA QUIERO QUE SE CIERREN TODAS LAS VENTANAS ABIERTAS
end if
If label88.caption = 3 Then
ACA QUE SE EJECUTE EL HL.EXE
end if
If label88.caption = 5 then
ACA QUE SE CIERRe EL HL.EXE
end if
If label88.caption = 7 then
label88.caption = 0
timer1.enabled = False
end if
end sub

ese codigo es para que se abra el counter, despues que se cierre y que se vuelva a abrir a los 1.5 segundos.

Intente hacerlo pero me dieron varios errores
#22
Editado.
#23
Programación Visual Basic / Detectar Archivo
5 Abril 2006, 15:03 PM
Como hago para detectar la ubicación de un archivo? por ejemplo hl.exe
#24
Programación Visual Basic / Problema con VB
5 Abril 2006, 04:11 AM
Hola gente cada vez que intento abrir un proyecto me sale esto:
http://img472.imageshack.us/img472/1219/dibujo21sz.jpg

Qué hago?
#25
Diseño Gráfico / Fondos en photoshop
3 Abril 2006, 17:31 PM
Holas gente.

necesito un fondo plateado como este:
http://img115.imageshack.us/my.php?image=sinttulo1copia4pg.jpg

Que diga "Counter Strike Anticheat" con las mismas letras que tiene la imagen y si es posible con el marco que tiene arriba.

Tamaño: 354x453 Pixeles